如何预测merMod对象的项(lme4)?

8

对于简单的glm对象,我可以使用predict(fit, type = "terms")来检索每个术语的拟合值矩阵。

那么对于lmer或者glmer拟合模型,有相应的等效物吗?据我所见,predict.merMod函数不支持type=terms

1个回答

2

lmerglmer拟合模型的等效方法是什么?

我认为没有一个完全等效的方法。但是,您可以按照以下方式轻松创建一个等效方法。

#####
# fit model with one terms which is a matrix
library(lme4)
fit <- lmer(Reaction ~ cbind(Days, (Days > 3) * Days) + (Days | Subject), 
            sleepstudy)

#####
# very similar code to `predict.lm`
pred_terms_merMod <- function(fit, newdata){
  tt <- terms(fit)
  beta <- fixef(fit)

  mm <- model.matrix(tt, newdata)
  aa <- attr(mm, "assign")
  ll <- attr(tt, "term.labels")
  hasintercept <- attr(tt, "intercept") > 0L
  if (hasintercept) 
    ll <- c("(Intercept)", ll)
  aaa <- factor(aa, labels = ll)
  asgn <- split(order(aa), aaa)
  if (hasintercept) {
    asgn$"(Intercept)" <- NULL
    avx <- colMeans(mm)
    termsconst <- sum(avx * beta)
  }
  nterms <- length(asgn)
  if (nterms > 0) {
    predictor <- matrix(ncol = nterms, nrow = NROW(mm))
    dimnames(predictor) <- list(rownames(mm), names(asgn))
    if (hasintercept) 
      mm <- sweep(mm, 2L, avx, check.margin = FALSE)
    for (i in seq.int(1L, nterms, length.out = nterms)) {
      idx <- asgn[[i]]
      predictor[, i] <- mm[, idx, drop = FALSE] %*% beta[idx]
    }
  } else {
    predictor <- ip <- matrix(0, n, 0L)
  }
  attr(predictor, "constant") <- if (hasintercept) termsconst else 0
  predictor
}

# use the function
newdata <- data.frame(Days = c(1, 5), Reaction = c(0, 0))
(out <- pred_terms_merMod(fit, newdata))
#R>   cbind(Days, (Days > 3) * Days)
#R> 1                        -21.173
#R> 2                         21.173
#R> attr(,"constant")
#R> [1] 283.24

#####
# confirm results
beta. <-  fixef(fit)
beta.[1] + beta.[2]
#R> (Intercept) 
#R>      262.07 
out[1] + attr(out, "constant")
#R> [1] 262.07

beta.[1] + (beta.[2] + beta.[3]) * 5
#R> (Intercept) 
#R>      304.41 
out[2] + attr(out, "constant")
#R> [1] 304.41

将上述内容扩展以包括标准误差应该很容易,据我所知。

网页内容由stack overflow 提供, 点击上面的
可以查看英文原文,
原文链接