我想知道是否有人可以帮我做点什么。我有一个装有 lme4 的混合效应模型,并且我已经提取了随机效应以绘制在点图中。我遵循了下面粘贴的非常有用的代码,并得到了显示的图。但是,我希望能够稍微整理一下 x 轴刻度,使其看起来更整洁一些。理想情况下,我希望轴刻度标签为 -0.1、0.1 和 0.3。我曾尝试在各个地方使用 scale_x_continous 修改函数,但由于我不完全确定整个代码如何协同工作,我不太清楚它会去哪里,或者它是否会起作用。我将非常感谢任何帮助,谢谢。
## re = object of class ranef.mer
ggCaterpillar <- function(re, QQ=TRUE, likeDotplot=TRUE) {
require(ggplot2)
f <- function(x) {
pv <- attr(x, "postVar")
cols <- 1:(dim(pv)[1])
se <- unlist(lapply(cols, function(i) sqrt(pv[i, i, ])))
ord <- unlist(lapply(x, order)) + rep((0:(ncol(x) - 1)) * nrow(x), each=nrow(x))
pDf <- data.frame(y=unlist(x)[ord],
ci=1.96*se[ord],
nQQ=rep(qnorm(ppoints(nrow(x))), ncol(x)),
ID=factor(rep(rownames(x), ncol(x))[ord], levels=rownames(x)[ord]),
ind=gl(ncol(x), nrow(x), labels=names(x)))
if(QQ) { ## normal QQ-plot
p <- ggplot(pDf, aes(nQQ, y)) + scale_x_continous(limits=c(-0.6,0.7), breaks=seq(-0.6,0.7, by=0.1), labels=c("-0.6","-0.5","-0.4","0.3","0.2","0.1","0.0", "0.1", "0.2", "0.3", "0.4", "0.5", "0.6", "0.7"))
p <- p + facet_wrap(~ ind, scales="free")
p <- p + xlab("Standard normal quantiles") + ylab("Random effect quantiles")
} else { ## caterpillar dotplot
p <- ggplot(pDf, aes(ID, y)) + coord_flip()
if(likeDotplot) { ## imitate dotplot() -> same scales for random effects
p <- p + facet_wrap(~ ind)
} else { ## different scales for random effects
p <- p + facet_grid(ind ~ ., scales="free_y")
}
p <- p + xlab("Levels") + ylab("Random effects")
}
p <- p + theme(legend.position="none")
p <- p + geom_hline(yintercept=0)
p <- p + geom_errorbar(aes(ymin=y-ci, ymax=y+ci), width=0, colour="black")
p <- p + geom_point(aes(size=1.2), colour="blue")
return(p)
#plotting the dotplot of my model
ggCaterpillar(ranef(model, condVar=TRUE), QQ=FALSE)