5

我正在尝试drc使用ggplot2. 这是我的第一次尝试(下面给出了 MWE)。但是,我的 ggplot2 与基本 R 图有点不同。我想知道我是否在这里遗漏了什么?

library(drc)
chickweed.m1 <- drm(count~start+end, data = chickweed, fct = LL.3(), type = "event")

plot(chickweed.m1, xlab = "Time (hours)", ylab = "Proportion germinated", 
xlim=c(0, 340), ylim=c(0, 0.25), log="", lwd=2, cex=1.2)  

在此处输入图像描述

library(data.table)
dt1 <- data.table(chickweed)

dt1Means1 <- dt1[, .(Germinated=mean(count)/200), by=.(start)]
dt1Means2 <- dt1Means1[, .(start=start, Germinated=cumsum(Germinated))]
dt1Means  <- data.table(dt1Means2[start!=0], Pred=predict(object=chickweed.m1))

library(ggplot2)
ggplot(data= dt1Means, mapping=aes(x=start, y=Germinated)) + 
    geom_point() +
    geom_line(aes(y = Pred)) +
    lims(y=c(0, 0.25)) +
    theme_bw()

在此处输入图像描述

已编辑

我遵循了这里给出的方法(有一些变化) 。

4

3 回答 3

8

注意,您可以跳到最后一段以获得简单的答案。该答案的其余部分记录了我是如何得出该解决方案的

查看 drc:::plot.drc 的代码,我们可以看到最后一行无形地返回了一个 data.frameretData

function (x, ..., add = FALSE, level = NULL, type = c("average", 
                                                      "all", "bars", "none", "obs", "confidence"), broken = FALSE, 
          bp, bcontrol = NULL, conName = NULL, axes = TRUE, gridsize = 100, 
          log = "x", xtsty, xttrim = TRUE, xt = NULL, xtlab = NULL, 
          xlab, xlim, yt = NULL, ytlab = NULL, ylab, ylim, cex, cex.axis = 1, 
          col = FALSE, lty, pch, legend, legendText, legendPos, cex.legend = 1, 
          normal = FALSE, normRef = 1, confidence.level = 0.95) 
{
  # ...lot of lines omitted...
  invisible(retData)
}

retData 包含拟合模型线的坐标,因此我们可以使用它来对 plot.drc 使用的相同模型进行 ggplot

pl <- plot(chickweed.m1, xlab = "Time (hours)", ylab = "Proportion germinated", 
        xlim=c(0, 340), ylim=c(0, 0.25), log="", lwd=2, cex=1.2)
names(pl) <- c("x", "y")
ggplot(data= dt1Means, mapping=aes(x=start, y=Germinated)) + 
  geom_point() +
  geom_line(data=pl, aes(x=x, y = y)) +
  lims(y=c(0, 0.25)) +
  theme_bw()

在此处输入图像描述

这与您在 ggplot 中使用 predict(object=chickweed.m1) 创建的版本相同。因此,差异不在于模型线,而在于绘制数据点的位置。invisible(retData)我们可以通过将函数的最后一行从 更改为来从 drc:::plot.drc 导出数据点list(retData, plotPoints)。为方便起见,我将 drc:::plot.drc 的整个代码复制到了一个新函数中。请注意,如果您希望复制此步骤,drcplot 调用的一些函数未在 drc 命名空间中导出,因此drc:::需要在对函数parFctaddAxesbrokenAxis和的所有调用之前添加makeLegend

drcplot <- function (x, ..., add = FALSE, level = NULL, type = c("average", 
                                                      "all", "bars", "none", "obs", "confidence"), broken = FALSE, 
          bp, bcontrol = NULL, conName = NULL, axes = TRUE, gridsize = 100, 
          log = "x", xtsty, xttrim = TRUE, xt = NULL, xtlab = NULL, 
          xlab, xlim, yt = NULL, ytlab = NULL, ylab, ylim, cex, cex.axis = 1, 
          col = FALSE, lty, pch, legend, legendText, legendPos, cex.legend = 1, 
          normal = FALSE, normRef = 1, confidence.level = 0.95) 
{
  # ...lot of lines omitted...
  list(retData, plotPoints)
}

并用你的数据运行它

pl <- drcplot(chickweed.m1, xlab = "Time (hours)", ylab = "Proportion germinated", 
          xlim=c(0, 340), ylim=c(0, 0.25), log="", lwd=2, cex=1.2)

germ.points <- as.data.frame(pl[[2]])
drc.fit <- as.data.frame(pl[[1]])
names(germ.points) <- c("x", "y")
names(drc.fit) <- c("x", "y")

现在,用 ggplot2 绘制这些得到你正在寻找的东西

ggplot(data= dt1Means, mapping=aes(x=start, y=Germinated)) + 
  geom_point(data=germ.points, aes(x=x, y = y)) +
  geom_line(data=drc.fit, aes(x=x, y = y)) +
  lims(y=c(0, 0.25)) +
  theme_bw()

在此处输入图像描述

最后,将此图 ( germ.points) 的数据点值与原始 ggplot ( dt1Means) 中的数据点值进行比较,显示了差异的原因。您计算的点dt1Means相对于 plot.drc 中的点提前了一个时间段。换句话说,plot.drc 将事件分配给它们发生的时间段的结束时间,而您将发芽事件分配给它们发生的时间间隔的开始时间。您可以简单地调整它,例如,使用

dt1 <- data.table(chickweed)
dt1[, Germinated := mean(count)/200, by=start]
dt1[, cum_Germinated := cumsum(Germinated)]
dt1[, Pred := c(predict(object=chickweed.m1), NA)]  # Note that the final time period which ends at `Inf` can not be predicted by the model, therefore added `NA` in the final row

ggplot(data= dt1, mapping=aes(x=end, y=cum_Germinated)) + 
  geom_point() +
  geom_line(aes(y = Pred)) +
  lims(y=c(0, 0.25)) +
  theme_bw()
于 2016-07-07T18:02:47.187 回答
2

从@dww 的答案中得到直觉,我不得不对我的原始代码进行两个小改动。只需替换start!=0end!=Inf

dt1Means1 <- dt1[, .(Germinated=mean(count)/200), by=.(start, end)]
dt1Means  <- data.table(dt1Means2[start!=0], Pred=predict(object=chickweed.m1))

给出正确的图表。

于 2016-07-08T14:17:52.587 回答
1

我真的很喜欢 dww 提供的解决方案。我是否可以建议对这个解决方案进行概括。通过将以下几行添加到您自己编写的版本中,drc:::plotdrc()您可以概括解决方案。该函数接受函数的输入,drc:::plotdrc()但输出一个与原始函数的默认基本图输出具有相同规格的 ggplot 对象。

只需替换invisible(retData, plotPoints)

result <- list(retData, plotPoints) 
points <- as.data.frame(result[[2]])
drc.fit <- as.data.frame(result[[1]]) 
names(points) <- c("x", "y")
names(drc.fit) <- c("x", "y")` 

gg_plot <- ggplot2::ggplot(data=points, aes(x = x, y = y)) + 
geom_point() +
geom_line(data=drc.fit, aes(x = x, y = y)) +
scale_x_continuous(trans='log10', limits = xlim) +
ylab(ylab) +
xlab(xlab) +
lims(y = ylim) +
theme_bw()
return(gg_plot)`
于 2018-01-13T14:25:49.087 回答