R中变量群的均值和置信区间

时间:2018-02-05 16:44:28

标签: r statistics hmisc desctools

我是R的新手,我正在尝试做一些我认为应该非常简单的事情但是在线代码没有帮助。

data <- structure(list(Group = c(1, 1, 1, 1, 2, 2, 2, 2, 3, 3, 3, 3), 
Time = c(1, 1, 2, 2, 1, 1, 2, 2, 1, 1, 2, 2), mean_PctPasses = c(68.26, 
60.2666666666667, 62.05, 66.3833333333333, 59.7333333333333, 
69.7714285714286, 57.1888888888889, 63.8875, 61.1833333333333, 
59.775, 66.2666666666667, 62.12), mean_AvgPassing = c(7.3, 
7.01111111111111, 6.35, 9.26666666666667, 6.68333333333333, 
8.78571428571429, 5.87777777777778, 8.3125, 7.63333333333333, 
7.7, 8.38333333333334, 6.89), mean_AvgRush = c(0.3, -0.3, 
3.5, 0.75, 5, 1.47142857142857, 5.71111111111111, 3.3875, 
2.74, 6.6, 4.5, 5), mean_Int = c(0.2, 0.777777777777778, 
0.25, 0.5, 1.5, 0.857142857142857, 0.777777777777778, 0.75, 
0.666666666666667, 0.75, 0.833333333333333, 1.1), mean_Rate = c(99.3, 
88.5222222222222, 80.5, 106.45, 77.2333333333333, 102.885714285714, 
76.8888888888889, 100.075, 92.1166666666667, 78.55, 98.05, 
79.56)), class = c("tbl_df", "tbl", "data.frame"), row.names = c(NA, 
-12L), .Names = c("Group", "Time", "mean_PctPasses", "mean_AvgPassing", 
"mean_AvgRush", "mean_Int", "mean_Rate"))

使用此数据集我有2个分组变量“Group”和“Time”。我希望以变量mean_PctPasses到mean_Rate的变量的每个组合的表格格式获得均值和置信区间,并保存结果,使其在表格中。我需要它在一张桌子里,因为我稍后会在剧情中提到它。在SPSS中执行此操作非常简单。

我尝试了几个功能,下面是我每个

的问题
library(rcompanion)    
ci.mean(mean_PctPasses~Group+Time, data = data)

library(DescTools)
MeanCI(data$mean_PctPasses)

library(Rmisc)
CI(data$mean_PctPasses,    ci=0.95)

MeanCI,ci.mean和CI不允许列出多个变量并保存为表格(仅显示在控制台中)

by(data = data, data$Group, FUN = stat.desc)

这不允许我根据组和时间对数据进行分组。下面是我希望在R中构建的图表示例(在SPSS中显示)。

SPSS Example

对此的任何帮助/协助都会很棒。如果需要任何澄清,请告诉我,我一定会编辑我的初始帖子。

更新

经过一些很好的回答(谢谢Rob和Steven),我觉得我需要澄清一下我的问题。 我想得到所有统计数据的每个组(不是单独的)的统计数据(mean_PctPasses到mean_Rate)。下面使用Rmisc显示一个函数示例,该函数生成我想要的一个变量的统计数据    库(Rmisc)    group.UCL(mean_PctPasses~Group + Time,data,FUN = CI) 这只为mean_PctPasses提供了以下输出 Output Using Rmisc

但我想要的是以下(我已经拍过照片) Image of Desired Ouput

当然,这可以在另一个方向显示(下面的示例使用SPSS和SEM)。 Alternative Orientation example in SPSS

4 个答案:

答案 0 :(得分:2)

假设您只想要每组的通常非合并t置信区间

java

答案 1 :(得分:2)

使用R执行此操作也很简单。

另一种方法,使用CI()中的Rmisc

library(dplyr)
library(Rmisc)
library(ggplot2)

data <- 
  data %>%
  group_by(Group, Time) %>%
  dplyr::summarise(avg_PctPasses = mean(mean_PctPasses), 
            uci_PctPasses = CI(mean_PctPasses)[1], 
            lci_PctPasses = CI(mean_PctPasses)[3]) %>%
  mutate(Time = Time %>% as.factor())

不可否认,在致电CI()之后,我不是“神奇数字”的忠实粉丝。

绘制数据同样简单。

data %>%
  ggplot(aes(x = Group, y = avg_PctPasses, fill = Time)) +
  geom_bar(stat = "identity", position = "dodge") +
  geom_errorbar(aes(ymin = lci_PctPasses, ymax = uci_PctPasses), position = "dodge")

enter image description here

答案 2 :(得分:0)

您可能有兴趣使用基本R图形重现SPSS样式。

library(DescTools)

z <- with(data, 
      aggregate(mean_PctPasses, list(Time, Group), MeanCI))
z <- xtabs(x ~ Group.1 + Group.2, z)

par(mar=c(5.1,4.1,4.1,8.1))
b <- barplot(z[,,1], beside=TRUE, ylim=c(0, 140), 
         col=c("royalblue3","limegreen"), las=1, 
         xlab="Group", ylab="Mean mean_PctPasses",
         panel.first={
           rect(par("usr")[1], par("usr")[3],          
                par("usr")[2], par("usr")[4], 
                col="grey85")
         })

 ErrBars(from=z[,,2], to=z[,,3], pos=b)
 legend(x="topright", legend=c("1","2"), title="Time", bty="n", 
   fill=c("royalblue3","limegreen"), inset=c(-.2, 0), xpd=TRUE)

barplot following SPSS style

尽管如此,您应该考虑使用点图来显示数据。

col <- c("royalblue3","limegreen")
PlotDot(z[,,1], args.errbars = list(from=z[,,2], to=z[,,3], mid=z[,,1],
                                pch=22, bg.pch=col, cex.pch=1.5), 
    color = col, lcolor = NA, 
    panel.first=abline(v=seq(0,150,10), col="grey", lty="dotted"))

dotplot groupwise

答案 3 :(得分:0)

更新 tidyr 1.0.0

作为之前给出的 summarise 解决方案的优雅替代方案,很高兴知道新的 tidyr 1.0.0 包含一个经常被忽视的函数:unnest_wider。 有了它,您可以将代码简化为以下内容:

data.to.plot <- data %>% 
  nest(data = -"Group") %>%
  mutate(ci = map(data, ~ MeanCI(.x$mean_PctPasses))) %>% 
  unnest_wider(ci)

给出

# A tibble: 3 x 5
  Group data              mean lwr.ci upr.ci
  <dbl> <list>           <dbl>  <dbl>  <dbl>
1     1 <tibble [4 × 6]>  64.2   58.3   70.1
2     2 <tibble [4 × 6]>  62.6   53.9   71.4
3     3 <tibble [4 × 6]>  62.3   57.9   66.8

您可以使用

轻松绘制此图
  ggplot(aes(x = Group, y = mean)) +
  geom_bar(aes (fill = Group), stat = "identity") +
  geom_errorbar(
    aes(
      ymin = lwr.ci, ymax = upr.ci,
      width = 0.5
    ),
    size = 0.5 # line thickness
  ) + 
  coord_flip() +
  scale_fill_brewer(palette = "Set2") +
  theme_minimal() 

给你

enter image description here