Nothing
pred.stenv <- function(m, Xnew){
if (is.null(m$ratio))
stop("The asymptotic distribution part of stenv is missing. Rerun stenv with asy = T")
r <- ncol(m$SigmaYcX)
n <- m$n
if (is.null(m$Gamma)) {
u <- 0
q <- 0
}
else {
u <- ncol(m$Gamma)
q <- ncol(m$Phi)
}
if (u == 0 || q == 0) {
value <- m$mu
covMatrix.estm <- m$SigmaYcX/n
covMatrix.pred <- (1 + 1/n) * m$SigmaYcX
}
else {
Xnew <- as.matrix(Xnew)
if (nrow(Xnew) == 1)
Xnew <- t(Xnew)
value <- m$mu + crossprod(m$beta, Xnew)
temp <- kronecker(diag(r), Xnew)
covMatrix.estm <- m$SigmaYcX/n + crossprod(temp, m$covMatrix) %*%
temp/n
covMatrix.pred <- (1 + 1/n) * m$SigmaYcX + crossprod(temp,
m$covMatrix) %*% temp/n
}
SE.estm <- sqrt(diag(covMatrix.estm))
SE.pred <- sqrt(diag(covMatrix.pred))
return(list(value = value, covMatrix.estm = covMatrix.estm,
SE.estm = SE.estm, covMatrix.pred = covMatrix.pred, SE.pred = SE.pred))
}
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.