Effects
包提供了一种非常快速和方便的方式来绘制通过lme4
包获得的线性混合效应模型结果。该effect
函数可以非常快速地计算置信区间(CI),但是这些置信区间的可信度如何?
例如:
library(lme4)
library(effects)
library(ggplot)
data(Pastes)
fm1 <- lmer(strength ~ batch + (1 | cask), Pastes)
effs <- as.data.frame(effect(c("batch"), fm1))
ggplot(effs, aes(x = batch, y = fit, ymin = lower, ymax = upper)) +
geom_rect(xmax = Inf, xmin = -Inf, ymin = effs[effs$batch == "A", "lower"],
ymax = effs[effs$batch == "A", "upper"], alpha = 0.5, fill = "grey") +
geom_errorbar(width = 0.2) + geom_point() + theme_bw()
根据使用effects
包装计算的配置项,批次“ E”与批次“ A”不重叠。
如果我尝试使用confint.merMod
函数和默认方法相同:
a <- fixef(fm1)
b <- confint(fm1)
# Computing profile confidence intervals ...
# There were 26 warnings (use warnings() to see them)
b <- data.frame(b)
b <- b[-1:-2,]
b1 <- b[[1]]
b2 <- b[[2]]
dt <- data.frame(fit = c(a[1], a[1] + a[2:length(a)]),
lower = c(b1[1], b1[1] + b1[2:length(b1)]),
upper = c(b2[1], b2[1] + b2[2:length(b2)]) )
dt$batch <- LETTERS[1:nrow(dt)]
ggplot(dt, aes(x = batch, y = fit, ymin = lower, ymax = upper)) +
geom_rect(xmax = Inf, xmin = -Inf, ymin = dt[dt$batch == "A", "lower"],
ymax = dt[dt$batch == "A", "upper"], alpha = 0.5, fill = "grey") +
geom_errorbar(width = 0.2) + geom_point() + theme_bw()
我看到所有配置项重叠。我还收到警告,表明该函数无法计算可信赖的配置项。这个示例以及我的实际数据集,使我怀疑effects
包在CI计算中采用了一些捷径,而这些捷径可能并未完全被统计学家所认可。函数从对象包返回的配置项的可信度如何?effect
effects
lmer
我尝试了什么:在源代码中,我注意到effect
函数依赖于Effect.merMod
函数,而函数又直接指向Effect.mer
函数,如下所示:
effects:::Effect.mer
function (focal.predictors, mod, ...)
{
result <- Effect(focal.predictors, mer.to.glm(mod), ...)
result$formula <- as.formula(formula(mod))
result
}
<environment: namespace:effects>
mer.to.glm
函数似乎从lmer
对象计算方差-协变量矩阵:
effects:::mer.to.glm
function (mod)
{
...
mod2$vcov <- as.matrix(vcov(mod))
...
mod2
}
反过来,这可能在Effect.default
函数中用于计算CI(我可能对这部分有误解):
effects:::Effect.default
...
z <- qnorm(1 - (1 - confidence.level)/2)
V <- vcov.(mod)
eff.vcov <- mod.matrix %*% V %*% t(mod.matrix)
rownames(eff.vcov) <- colnames(eff.vcov) <- NULL
var <- diag(eff.vcov)
result$vcov <- eff.vcov
result$se <- sqrt(var)
result$lower <- effect - z * result$se
result$upper <- effect + z * result$se
...
我对LMM知之甚少,无法判断这是否是正确的方法,但是考虑到有关LMM的置信区间计算的讨论,这种方法似乎很简单。