这是前一篇文章(How to modify slots lme4 >1.0)的后续问题。我有一个类似的成对数据结构,并希望随机效果同时考虑" pops"在一对。我有一个功能随机拦截模型使用以前建议的代码:
dat <- data.frame(pop1 = c(2,1,1,1,1,3,2,2,2,3,5,3,5,4,6),
pop2 = c(1,3,4,5,6,2,4,5,6,4,3,6,4,6,5),
X = c(20,25,18,40,36,70,68,72,78,76,97,100,115,110,108),
Y = c(18,16,15,40,22,18,18,18,18,45,10,47,67,5,6))
#build random effects matrix
Zl<-lapply(c("pop1","pop2"),function(nm)Matrix:::fac2sparse(dat[[nm]],"d",drop=FALSE))
ZZ<-Reduce("+",Zl[-1],Zl[[1]])
#specify model structure
mod<-lFormula(Y~X+(1|pop1),data=dat,REML=TRUE)
#replace slot
mod$reTrms$Zt <- ZZ
#fit model
dfun<-do.call(mkLmerDevfun,mod)
opt<-optimizeLmer(dfun)
mkMerMod(environment(dfun),opt,mod$reTrms,fr=mod$fr)
但是,在尝试添加随机斜率变量时:
mod2<-lFormula(Y~X+(1+X|pop1),data=dat,REML=TRUE)
mod2$reTrms$Zt <- ZZ
dfun<-do.call(mkLmerDevfun,mod2)
导致上一篇文章中发现的同一错误(问题是调用错误的数据框):&#34; Lambdat%*%Ut中的错误: Cholmod错误&A; B内部维度必须匹配&#39;在文件../MatrixOps/cholmod_ssmult.c,第82行&#34;
plot(1,type="n",xlim=c(0,150),ylim=c(0,75),ylab = "Y",xlab="X")
for(i in 1:length(unique(c(dat$pop1,dat$pop2)))){
subdat<-dat[which(dat$pop1==i | dat$pop2==i),]
out<-summary(lm(subdat$Y~subdat$X))
x=subdat$X
y=x*out$coefficients[2,1]+out$coefficients[1,1]
lines(x,y,col=i))
}
legend(125,60,1:6,col=1:6,lty=1,title="Pop")
答案 0 :(得分:2)
dat <- data.frame(pop1 = c(2,1,1,1,1,3,2,2,2,3,5,3,5,4,6),
pop2 = c(1,3,4,5,6,2,4,5,6,4,3,6,4,6,5),
X = c(20,25,18,40,36,70,68,72,78,76,97,100,115,110,108),
Y = c(18,16,15,32,22,29,32,38,44,45,51,47,67,59,61))
有助于尝试了解原始代码实际执行的操作:
## build random effects matrix
## 1. sparse dummy-variable matrices for each population ID
Zl <- lapply(dat[c("pop1","pop2")],
Matrix::fac2sparse,to="d",drop.unused.levels=FALSE)
## 2. take the sum of all components of the list of dummy-variable matrices ...
ZZ <- Reduce("+",Zl[-1],Zl[[1]])
如果我们有一个很长的列表,Reduce
表单一般都很方便,但在这种情况下它只是Zl[[1]]+Zl[[2]]
...
all.equal(Zl[[1]]+Zl[[2]],ZZ) ## TRUE
这个RE结构是什么样的?
library(gridExtra)
grid.arrange(
image(t(Zl[[1]]),main="pop 1",sub="",xlab="pop",ylab="obs"),
image(t(Zl[[2]]),main="pop 2",sub="",xlab="pop",ylab="obs"),
image(t(ZZ),main="combined",sub="",xlab="RE",ylab="obs"),
nrow=1)
对于随机斜率,我认为我们想要获取ZZ
的每个填充元素,并将其替换为X
的相应观察/行的dat
值}:这里的索引有点模糊 - 在这种情况下,归结为Z
/ Zt
列的每一行中有2个填充值(稀疏的@p
个插槽matrix给出了一个零索引指针,指向每列中的第一个非零元素......)
vals <- dat$X[rep(1:(length(ZZ@p)-1),diff(ZZ@p))]
ZZX <- ZZ
ZZX@x <- vals
image(t(ZZX))
library(lme4)
mod <- lFormula(Y~X+(X|pop1),data=dat,REML=TRUE)
## replace slot
mod$reTrms$Zt <- rbind(ZZ,ZZX)
## fit model
dfun <- do.call(mkLmerDevfun,mod)
opt <- optimizeLmer(dfun)
m1 <- mkMerMod(environment(dfun),opt,mod$reTrms,fr=mod$fr)
这个似乎可以工作,但你一定要用你自己对这里应该发生的事情的知识进行检查......