将错误栏添加到 ggplot 时出错

Error when adding errorbars to ggplot

尊敬的 Whosebug 用户,

我想绘制一个包含三个带误差条的自变量的分组条形图。我的图表基于 Stacked Overflow(分组条内的堆叠条)的示例,使用 ggplot 和 geom_bar。当我根据帮助页面的示例添加 geom_errorbar 时,出现以下错误: Error in if (empty(data)) { : missing value where TRUE/FALSE needed

这是我使用的脚本:

treatment<-rep(c(rep(c(1),8),rep(c(2),8)),2)
origin<-rep(c("A","B"),16)
time<-c(rep(c(5),16),rep(c(10),16))
sulfide<-c(0,10,5,8,9,6,16,18,20,25,50,46,17,58,39,43,20,25,50,46,17,58,39,43,100,120,103,104,150,160,200,180)

Reed<-data.frame(treatment,origin,time,sulfide)

# specify factor types
Reed$treatment<-as.factor(Reed$treatment)
Reed$origin<-as.character(Reed$origin)
Reed$time<-as.factor(Reed$time)

library(ggplot2)
library(scales)

#draw plot
ggplot() +geom_bar(data=Reed, aes(y = sulfide, x = treatment, fill=origin), stat="identity",position="dodge") +theme_bw() + facet_grid( ~ time)+xlab("treatment") +ylab("Sulfide")+ggtitle("Time)")

这是我添加错误栏的方式:

ErrorBars <- function(x, y, upper, lower=upper, length=0.03,...{if(length(x) != length(y) | length(y) !=length(lower) | length(lower) != length(upper))stop("vectors must be same length")arrows(x,y+upper, x, y-lower, angle=90, code=3, length=length, ...)}#function for errorbars

SE<- function(x) sqrt(var(x,na.rm=TRUE)/length(na.omit(x))) #function for SE

Reed$trt<- paste(Reed$treatment,Reed$origin,sep="")#combine treatment and origin to a column 
mean_Reed<-data.frame(tapply(Reed$sulfide,list(Reed$trt,Reed$time),mean,na.rm=TRUE)) #mean
SE_Reed<-data.frame(tapply(Reed$sulfide,list(Reed$trt, Reed$time),SE)) # SE 

limits <- aes(ymax = mean_Reed + SE_Reed, ymin=mean_Reed - SE_Reed)# Define the top and bottom of the errorbars

#plot with error bars:
ggplot() +geom_bar(data=Reed, aes(y = sulfide, x = treatment, fill=origin), stat="identity",position="dodge") +theme_bw() + facet_grid( ~ time)+xlab("treatment") +ylab("Sulfide")+ggtitle("Time)"+ geom_errorbar(limits, width=.2,position="dodge") 

我真的找不到我做错了什么。 我希望你能帮助我:)

如果您想通过制作汇总数据集来构建误差线,您只需要以正确的格式获取该数据集。有很多选择;我将使用 dplyr。请注意,我以 "tidy" 格式保留此数据集中图中的所有分组变量,每个变量在单独的列中。

library(dplyr)
meandat = Reed %>% 
    group_by(treatment, time, origin) %>%
    summarise(mean = mean(sulfide, na.rm = TRUE), se = SE(sulfide))

Source: local data frame [8 x 5]
Groups: treatment, time [?]

  treatment   time origin   mean        se
     (fctr) (fctr)  (chr)  (dbl)     (dbl)
1         1      5      A   7.50  3.378856
2         1      5      B  10.50  2.629956
3         1     10      A  31.50  7.858117
4         1     10      B  43.00  6.819091
5         2      5      A  31.50  7.858117
6         2      5      B  43.00  6.819091
7         2     10      A 138.25 23.552689
8         2     10      B 141.00 17.540429

现在可以通过 geom_errorbar 添加误差线。你会看到我在 ggplot 中全局设置了美学,以避免我自己不得不重新输入其中的一些,但你可以根据需要更改它。我使用 position_dodge 将误差条正确放置在每个条上。

ggplot(data = Reed, aes(y = sulfide, x = treatment, fill=origin)) +
    geom_bar(stat="identity", position="dodge") +
    theme_bw() + 
    facet_grid( ~ time)+
    xlab("treatment") +
    ylab("Sulfide")+
    ggtitle("Time")+ 
    geom_errorbar(data = meandat, aes(ymin = mean - se, ymax = mean + se, y = mean), 
                position = position_dodge(width = .9))

您实际上可以通过 stat_summary 完成所有这些,而不是计算摘要统计信息 "by hand"。一个例子是 here。代码看起来像这样,并给出与上面相同的图。

ggplot(data = Reed, aes(y = sulfide, x = treatment, fill=origin)) +
    geom_bar(stat="identity",position="dodge") +
    theme_bw() + 
    facet_grid( ~ time) +
    xlab("treatment") +
    ylab("Sulfide") +
    ggtitle("Time") + 
    stat_summary(geom = "errorbar", fun.data = mean_cl_normal, mult = 1, 
               position = position_dodge(width = .9))

一直在使用ggplot2开发版,ggplot2_1.0.1.9003,发现需要添加stat_summary函数参数通过 fun.args。这看起来像 fun.args = list(mult = 1) 以获得 1 个标准错误的错误栏。

暂时不考虑错误栏的问题,你的情节有一个更严重的问题。 treatmenttimeorigin 各有 2 个值,总共有 8 个组合,但有 32 个硫化物值 - 因此每个组合有 4 个硫化物值。当您使用

绘制此图时
ggplot(data=Reed) +
  geom_bar(aes(y = sulfide, x = treatment, fill=origin), stat="identity",position="dodge") +
  facet_grid( ~ time)+xlab("treatment") +ylab("Sulfide")

您正在绘制 所有四个 硫化物值的条形图,它们都以相同的颜色相互叠加。这具有仅显示最大值的效果。很难相信这是您的意图,即使您这样做了,也有更好的方法来做到这一点。例如,如果你想为每个因素组合绘制 sulfide 的平均值,你可以这样做。

ggp <- ggplot(data=Reed, aes(y = sulfide, x = as.factor(treatment), group=origin)) +
  geom_bar(aes(fill=origin), stat="summary", fun.y=mean, position="dodge") +
  theme_bw() + 
  facet_grid( ~ time)+xlab("treatment") +ylab("Sulfide")+ggtitle("Time")
ggp

这使用 stat="summary" 使用聚合函数 mean (fun.y=mean) 自动汇总结果。

因为可以使用类似的方法非常简单地添加误差线:

se <- function(y) sd(y)/length(y)   # to calculate standard error in the mean
ggp+stat_summary(geom="errorbar",position=position_dodge(width=0.85),
                 fun.data=function(y)c(ymin=mean(y)-se(y),ymax=mean(y)+se(y)), width=0.1)

请注意,无需在外部聚合数据 - ggplot 会为您完成。

最后,这种方法有助于使用许多内置函数来生成具有更严格统计的置信限度。

ggp+stat_summary(fun.data=mean_cl_normal, conf.int=0.95,
                 geom="errorbar",position=position_dodge(width=0.85), width=0.1)

所以这里我们使用 ggplot 内置函数 mean_cl_normal 来计算均值的 95% 置信限,假设数据服从正态分布(因此,均值将遵循t 分布)。我们使用参数 conf.int=... 来指定所需的置信区间,但默认值为 0.95,因此在此示例中确实没有必要。

这种类型还有其他几个函数:请参阅 the documentation 和其中的链接以获取解释。