R/od_D_DEL.R

Defines functions od_D_DEL

Documented in od_D_DEL

od_D_DEL <- function(Fx, w) {
    
    M <- infmat(Fx, w, echo = FALSE)
    if (rcond(M) < sqrt(.Machine$double.eps)) 
        warning("The information matrix may be badly conditioned.")
    n <- nrow(Fx); m <- ncol(Fx)
    M <- infmat(Fx, w, echo = FALSE)
    d.fun <- ((Fx %*% t(chol(solve(M))))^2) %*% rep(1, m)
    eps <- max(d.fun) - m + 1e-12
    thr <- m * (1 + eps/2 - sqrt(eps * (4 + eps - 4/m))/2)
    keep <- (1:n)[d.fun >= thr]
    
    return(keep)
}

Try the OptimalDesign package in your browser

Any scripts or data that you put into this service are public.

OptimalDesign documentation built on March 26, 2020, 9:35 p.m.