4

我想使用新 lme4 包(目前是开发者版本)的新 bootMer() 功能。我是 R 新手,不知道应该为其 FUN 参数编写哪个函数。它说它需要一个数值向量,但我不知道该函数将执行什么。所以我有一个混合模型公式,它被转换为 bootMer(),并且有许多复制。所以我不知道那个外部函数是做什么的?它应该是引导方法的模板吗?bootMer中不是已经实现了引导方法吗?那么为什么他们需要一个外部的“感兴趣的统计数据”呢?我应该使用哪个感兴趣的统计数据?

以下语法是否适合使用?R 不断产生错误,即 FUN 必须是数字向量。我不知道如何将估计与“适合”分开,甚至我应该首先这样做吗?我只能说我迷失了那个“有趣”的论点。另外我不知道我应该使用变量“Mixed5”传递混合模型 glmer() 公式还是应该传递一些指针和引用?我在示例中看到 X(bootMer() 的第一个参数是 *lmer() 对象。我想写 *Mixed5 但它呈现错误。

非常感谢。

我的代码是:

library(lme4)
library(boot)

(mixed5 <- glmer(DV ~ (Demo1 +Demo2 +Demo3 +Demo4 +Trt)^2 
                 + (1 | PatientID) + (0 + Trt | PatientID)
                 , family=binomial(logit), MixedModelData4))


FUN <- function(formula) {
  fit <- glmer(DV ~ (Demo1 +Demo2 +Demo3 +Demo4 +Trt)^2 
               + (1 | PatientID) + (0 + Trt | PatientID)
               , family=binomial(logit), MixedModelData4)
  return(coef(fit))
}

result <- bootMer(mixed5, FUN, nsim = 3, seed = NULL, use.u = FALSE,
        type = c("parametric"),
        verbose = T, .progress = "none", PBargs = list())

result
FUN
fit

和错误:

Error in bootMer(mixed5, FUN, nsim = 3, seed = NULL, use.u = FALSE, type = c("parametric"),  : 
  bootMer currently only handles functions that return numeric vectors

-------------------------------------------------- - - - 更新 - - - - - - - - - - - - - - - - - - - - - - ----------

我按照 Ben 的指示编辑了代码。代码运行得非常好,但 SE 和 Biase 都为零。你也知道如何从这个输出中提取 P 值(对我来说很奇怪)?我应该使用 afex 包的 mixed() 吗?

我修改后的代码:

library(lme4)
library(boot)

(mixed5 <- glmer(DV ~ (Demo1 +Demo2 +Demo3 +Demo4 +Trt)^2 
                + (0 + Trt | PatientID)
                 , family=binomial(logit), MixedModelData4))


FUN <- function(fit) {
  fit <- glmer(DV ~ (Demo1 +Demo2 +Demo3 +Demo4 +Trt)^2 
               + (1 | PatientID) + (0 + Trt | PatientID)
               , family=binomial(logit), MixedModelData4)
  return(fixef(fit))
}

result <- bootMer(mixed5, FUN, nsim = 3)

result

-------------------------------------------------- ------ 更新 2 ------------------------------------------ ------------

我也尝试了以下方法,但代码生成了警告并且没有给出任何结果。

(mixed5 <- glmer(DV ~ Demo1 +Demo2 +Demo3 +Demo4 +Trt 
                 + (1 | PatientID) + (0 + Trt | PatientID)
                 , family=binomial(logit), MixedModelData4))

FUN <- function(mixed5) {
  return(fixef(mixed5))}

result <- bootMer(mixed5, FUN, nsim = 2)

警告信息:

In bootMer(mixed5, FUN, nsim = 2) : some bootstrap runs failed (2/2)
> result

Call:
bootMer(x = mixed5, FUN = FUN, nsim = 2)

Bootstrap Statistics :
WARNING: All values of t1* are NA
WARNING: All values of t2* are NA
WARNING: All values of t3* are NA
WARNING: All values of t4* are NA
WARNING: All values of t5* are NA
WARNING: All values of t6* are NA

-------------------------------------------------- ------ 更新 3 ------------------------------------------ ------------

此代码也生成警告:

FUN <- function(fit) {
  return(fixef(fit))}

result <- bootMer(mixed5, FUN, nsim = 2)

警告和结果:

Warning message:
In bootMer(mixed5, FUN, nsim = 2) : some bootstrap runs failed (2/2)
> result

Call:
bootMer(x = mixed5, FUN = FUN, nsim = 2)

Bootstrap Statistics :
WARNING: All values of t1* are NA
WARNING: All values of t2* are NA
WARNING: All values of t3* are NA
WARNING: All values of t4* are NA
WARNING: All values of t5* are NA
WARNING: All values of t6* are NA
4

2 回答 2

10

这里基本上有两个(简单的)混淆。

  • 第一个是介于coef()(返回矩阵列表)和fixef()(返回固定效应系数的向量)之间:我假设这fixef()是您想要的,尽管您可能想要类似c(fixef(mixed),unlist(VarCorr(mixed))).
  • 第二个是FUN应该将拟合的模型对象作为输入......

例如:

library(lme4)
library(boot)

mixed <- glmer(incidence/size ~ period + (1|herd),
               weights=size, data=cbpp, family=binomial)

FUN <- function(fit) {
    return(fixef(fit))
}

result <- bootMer(mixed, FUN, nsim = 3)

result

## Call:
## bootMer(x = mixed, FUN = FUN, nsim = 3)
## Bootstrap Statistics :
##      original      bias    std. error
## t1* -1.398343 -0.20084060  0.09157886
## t2* -0.991925  0.02597136  0.18432336
## t3* -1.128216 -0.03456143  0.05967291
## t4* -1.579745 -0.08249495  0.38272580
## 
于 2013-08-26T13:22:33.050 回答
3

这可能是同一个问题,我在此处报告为问题。至少它会导致相同的、无用的错误消息,并且也花了我一段时间。

这意味着您的数据中有缺失,lmer 会忽略这些缺失,但会杀死 bootMer。

尝试:

(mixed5 <- glmer(DV ~ (Demo1 +Demo2 +Demo3 +Demo4 +Trt)^2 
                 + (1 | PatientID) + (0 + Trt | PatientID)
                 , family=binomial(logit), na.omit(MixedModelData4[,c('DV','Demo1','Demo2','Demo3','Trt','PatientId')])))
于 2013-12-04T16:54:23.970 回答