如何用R

时间:2017-12-22 16:01:37

标签: r lme4

我希望重现霍夫曼和霍夫曼报道的结果。 Rovine的作品(实验心理学家的多层次模型:基础和说明性例子)与R的lme4包。

在他们的第一个例子中,他们比较了老年人和年轻人之间的反应时间。他们的每个参与者都有许多任务试验。因此,在个人层面,参与者'反应时间受与其试验操作相关的各种变量的影响。在第二级,参与者'年龄和年龄组会影响参与者'反应时间。

在霍夫曼的2B模型中,他们分别估计了老年人和年轻人的一级残差,为年轻人和老年人提供了两个虚拟变量。

霍夫曼的方程是 Level1 equation

我想知道如何估算lme4包中的两个残差。

霍夫曼的文章和示例数据可以在Hoffman's website.

中找到

我已经成功复制了他们的模型2A的结果,其中假设年轻人和老年人的差异是相同的,使用以下代码。

lmer(lg_rt ~ c_mean + c_sal + (1|Item) + oldage + yrs65 + (1|id), Ex1, REML = F)

1 个答案:

答案 0 :(得分:0)

您可以使用模块化拟合函数处理 lme4 中的异方差性。这是一个包含两个组的示例,它应该可以扩展到其他类型的异方差。请注意,虽然估计了权重,但最终拟合中参数的标准误差并未考虑权重的不确定性。这个问题应该可以使用 delta 方法来解决,例如参见https://10.3102/1076998611417628 的第 2.3.3 节中的第一个方程。

set.seed(1234)
library(dplyr)
#> 
#> Attaching package: 'dplyr'
#> The following objects are masked from 'package:stats':
#> 
#>     filter, lag
#> The following objects are masked from 'package:base':
#> 
#>     intersect, setdiff, setequal, union
library(tidyr)
library(lme4)
#> Loading required package: Matrix
#> 
#> Attaching package: 'Matrix'
#> The following objects are masked from 'package:tidyr':
#> 
#>     expand, pack, unpack

n <- 100 # number of level-2 units
m <- 3 # number of repeated observations per unit
sd_b <- .3 # random intercept standard deviation
sd_eps1 <- .1 # residual standard deviation in group 1
sd_eps2 <- .3 # residual standard deviation in group 2

# Simulate data
dat <- tibble(
  # unique ID
  id = seq_len(n),
  # explanatory variable, constant over repetitions
  x = runif(n),
  # random intercept
  b = rnorm(n, sd = sd_b),
  # group membership
  grp = sample(1:2, n, replace = TRUE)
) %>% 
  uncount(3) %>% 
  mutate(
    # residual
    eps = rnorm(nrow(.), sd = c(sd_eps1, sd_eps2)[grp]),
    # response, fixed effect is beta=1
    y = x + b + eps
  )

# now optimize over residual weights, fixing the group 1 weight to 1.
# optimize() would be sufficient, but I show it with optim() because it
# then can be directly extended to a larger number of groups
opt <- optim(
  # initial value for group 2 residual relative to group 1
  par = 1,
  fn = function(weight){
    # Compute weights from group variable
    df <- dat %>% 
      mutate(weight = c(1, weight)[grp])
    ## 1.  Parse the data and formula:
    lmod <- lFormula(y ~ x + (1|id), data = df, weights = df$weight)
    ## 2.  Create the deviance function to be optimized:
    devfun <- do.call(mkLmerDevfun, lmod)
    ## 3.  Optimize the deviance function:
    opt <- optimizeLmer(devfun)
    # return the deviance 
    opt$fval
  },
  # Use a method that allows box constraints
  method = "L-BFGS-B",
  # Weight cannot be negative
  lower = 0.01
)

# The weight estimates the following ratio, and it is pretty close
sd_eps1^2/sd_eps2^2
#> [1] 0.1111111
opt$par
#> [1] 0.1035914
# We can now fit the final model at the chosen weights
df <- dat %>% 
  mutate(weight = c(1, opt$par)[grp])
mod <- lmer(y ~ x + (1|id), data = df, weights = df$weight)

# Our estimate of sd_eps1
sigma(mod)
#> [1] 0.09899687
# True value
sd_eps1
#> [1] 0.1
# Our estimate of sd_eps2
sigma(mod) * sqrt(1/opt$par)
#> [1] 0.307581
# True value
sd_eps2
#> [1] 0.3

reprex package (v1.0.0) 于 2021 年 2 月 10 日创建