如何将统计检验结果作为 ggplot2 中 facet 的 plotmath 表达式呈现

3

我希望在一个分面 ggplot 图表中包含多个统计测试的结果。

我已经找到了很多优秀的示例(如 this)来说明如何将类似内容包含在标题或注释中,但是,我的兴趣在于将其作为文本注释包含在图表中,以便我可以在一个图上展示许多测试的结果。

我已经能够使用标准文本注释来实现这一点,但我想使用 polymath/expressions 来呈现我的结果,以便我可以生成符合 APA 样式指南的注释,该样式指南在 [ggstatsplot]1 包中实现,如下例所示:

enter image description here

我已经包含了一个可复现的例子,使用了 ggplot2 中的 diamonds 数据。 我尝试过的一些方法包括:
  • 尝试将 bquoteexpression 对象存储为 wilcox_stats 对象中的列 - 但是 dplyr 似乎不喜欢它
  • 尝试从 ggplot 调用所有内容 - 但是当尝试排除 geom_text 打印的所有注释时,情况变得非常混乱
如果你能提供任何帮助或指引,我将不胜感激。
# LOAD REQUIRED PACKAGES

library(ggplot2)
library(tidyverse)
library(rstatix)

# CREATE SAMPLE DATA

sample_data <- diamonds %>%
  select(cut, color, table) %>%
  filter(color == c("E","J")) %>%
  mutate(time = factor(case_when(
    table %% 2 == 0 ~ "Before",
    TRUE ~ "After"))) %>%
  group_by(color, time) %>%
  sample_n(100) %>%
  ungroup() %>%
  mutate(numeric_cut = case_when(
    cut == "Ideal" ~ 1, 
    cut == "Premium" ~ 2,     
    cut == "Very Good" ~ 3,
    cut == "Good" ~ 4,
    cut == "Fair" ~ 5))

# STAT TESTS

wilcox_test <- sample_data %>%
  group_by(color) %>%
  wilcox_test(numeric_cut ~ time, paired = TRUE, detailed = TRUE) %>%
  select(color, statistic, p, n1)

wilcox_es <- sample_data %>%
  group_by(color) %>%
  wilcox_effsize(numeric_cut ~ time, paired = TRUE, ci = TRUE) %>%
  select(color, effsize, conf.low, conf.high)

## EXTRACT ELEMENTS OF STAT TESTS AND USE THEM TO CREATE ANNOTATION

wilcox_stats <- left_join(wilcox_test, wilcox_es) %>%
  mutate(statistic = round(statistic, 1)) %>%
  mutate(effsize = round(effsize, 2)) %>%
  mutate(p = round(p, 3)) %>%
  mutate(result = deparse(bquote(
    V[Wilcoxon]==.(statistic)~ #this code does not work
    italics(p)==.p~ 
    hat(r) == .effsize~
    "CI"["95%"]~
    .conf.low~.conf.high~
    n[pairs]==.n1)))

## PREPARE PLOT DATA

plot_data <- sample_data %>%
  group_by(time, cut, color) %>%
  tally() %>%
  ungroup() %>%
  group_by(color) %>%
  mutate(total_n = sum(n)) %>%
  mutate(percent = (n/total_n)*100) %>%
  mutate(percent = round(percent, 1)) %>%
  ungroup() %>%
  left_join(wilcox_stats) %>%
  mutate(result = case_when(
    time == "Before" & cut == "Ideal" ~ "",
    time == "After" & cut == "Ideal" ~ "",
    time == "Before" & cut == "Premium" ~ "",
    time == "After" & cut == "Premium" ~ "",
    time == "Before" & cut == "Very Good" ~ "",
    time == "After" & cut == "Very Good" ~ result,
    time == "Before" & cut == "Good" ~ "",
    time == "After" & cut == "Good" ~ "",
    time == "Before" & cut == "Fair" ~ "",
    time == "After" & cut == "Fair" ~ "")) %>%
  mutate(time = factor(time, levels = c("Before", "After", ordered = TRUE)))

## PLOT RESULTS

plot <- plot_data %>%
  ggplot() +
  aes(x = cut, y = percent, fill = cut) +
  geom_bar(stat = "identity") +
  geom_text(aes(label = result, y = 30), size = 5, parse = TRUE) +
  facet_grid(color ~ time)

下图显示了我希望创建的输出要点...

enter image description here

1个回答

2
我可能会使用 paste 创建表达式(老实说,因为我觉得这样包含变量更容易)。我稍微缩短了代码,也没有使用你的完整表达式,但我认为这应该足以让你理解思路了。
library(tidyverse)

sample_data <- diamonds %>%
  select(cut, color, table) %>%
  filter(color == c("E","J")) %>%
  mutate(time = if_else(table %% 2 == 0, "Before", "After")) %>%
  group_by(color, time) %>%
  sample_n(100) %>%
  ungroup() %>%
  mutate(numeric_cut = as.numeric(cut))

wilcox_test <- sample_data %>%
  group_by(color) %>%
  rstatix::wilcox_test(numeric_cut ~ time, paired = TRUE, detailed = TRUE) %>%
  select(color, statistic, p, n1)

wilcox_es <- sample_data %>%
  group_by(color) %>%
  rstatix::wilcox_effsize(numeric_cut ~ time, paired = TRUE, ci = TRUE) %>%
  select(color, effsize, conf.low, conf.high)

这里是关键部分。
wilcox_stats <- left_join(wilcox_test, wilcox_es) %>%
  mutate(statistic = round(statistic, 1),
         effsize = round(effsize, 2),
         p = round(p, 3),
         label = paste('V[Wilcoxon]==', statistic, '~italic(p)==~', p))
#> Joining, by = "color"

plot_data <- sample_data %>%
  count(time, cut, color) %>%
  group_by(color) %>%
  mutate(total_n = sum(n),
         percent = round((n/total_n)*100,1)) %>%
  ungroup() %>%
  left_join(wilcox_stats) %>%
  mutate(result = if_else(time == "After" & cut == "Very Good", label, ""))
#> Joining, by = "color"

plot_data %>%
  ggplot() +
  aes(x = cut, y = percent, fill = cut) +
  geom_bar(stat = "identity") +
  geom_text(aes(label = result, y = 30), parse = TRUE) +
  facet_grid(color ~ time)

创建于2020年4月26日,使用reprex包(v0.3.0)。

太棒了!非常感谢 @Tjebo! - vengefulsealion

网页内容由stack overflow 提供, 点击上面的
可以查看英文原文,
原文链接