################################################### ### chunk number 1: ################################################### simfun <- function(ng=20,nr=100,fsd=1,indsd=0.5, b=c(1,2)) { ntot <- nr*ng b.reff <- rnorm(ng,sd=fsd) b.rind <- rnorm(ntot,sd=indsd) x <- runif(ntot) dd <- data.frame(x,f=factor(rep(LETTERS[1:ng],each=nr)), obs=1:ntot) dd$eta0 <- model.matrix(~x,data=dd) %*% b dd$eta <- with(dd,eta0 + b.reff[f]+b.rind[obs]) dd$mu <- exp(dd$eta) dd$y <- with(dd,rpois(ntot,lambda=mu)) dd } ################################################### ### chunk number 2: ################################################### library(lme4) set.seed(1001) dd <- simfun() (m0 <- glmer(y~x+(1|f),family="poisson",data=dd)) (m1 <- glmer(y~x+(1|f)+(1|obs),family="poisson",data=dd)) ################################################### ### chunk number 3: ################################################### cfun <- function(d) { m <- glmer(y~x+(1|f)+(1|obs),family="poisson",data=d) c(sqrt(unlist(VarCorr(m))),fixef(m)) } ################################################### ### chunk number 4: ################################################### rr <- replicate(50,cfun(simfun())) ################################################### ### chunk number 5: ################################################### library(plotrix) library(reshape) mm <- melt(t(rr)) library(lattice) print(bwplot(value~X2,data=mm, panel=function(...) { panel.bwplot(...) panel.points(1:4,c(1,1,0.5,2),col=2,pch=16) })) ################################################### ### chunk number 6: eval=FALSE ################################################### ## library(lme4) ## load("gopherdat2.RData") ## head(Gdat) ## Gdat$obs <- 1:nrow(Gdat) ## g1 <- glmer(shells~factor(year)+prev+offset(log(Area))+(1|Site)+(1|obs), ## data=Gdat,family="poisson") ## g0 <- glmer(shells~factor(year)+prev+offset(log(Area))+(1|Site), ## data=Gdat,family="poisson") ##