r - 在 group_by() %>% mutate() 函数调用中使用带引号的变量

标签 r dplyr tidyeval

可重现的示例

cats <-
  data.frame(
    name = c(letters[1:10]),
    weight = c(rnorm(5, 10, 1), rnorm(5, 20, 3)),
    type = c(rep("not_fat", 5), rep("fat", 5))
  )

get_means <- function(df, metric, group) {
  df %>%
    group_by(.[[group]]) %>%
    mutate(mean_stat = mean(.[[metric]])) %>%
    pull(mean_stat) %>%
    unique()
}

get_means(cats, metric = "weight", group = "type")

我试过的

我希望得到两个值,而不是我得到一个值。看来 groupby 失败了。

我尝试了所有方法,包括使用 quo()、eval() 和替换 ()、UQ()、!! 以及许多其他方法来尝试使 group_by() 中的内容起作用。

这看起来非常简单,但我无法弄清楚。

代码推理

将变量放在引号中的决定是因为我在 ggplot aes_string() 调用中使用它们。我在函数中排除了 ggplot 代码以简化代码,否则会很容易,因为我们可以使用标准评估。

最佳答案

我认为在 tidyeval 框架中执行此操作的“预期”方法是将参数作为名称(而不是字符串)输入,然后使用 enquo() 引用参数。 ggplot2 理解 tidy 评估运算符,因此这也适用于 ggplot2

首先,让我们修改示例中的 dplyr 汇总函数:

library(tidyverse)
library(rlang)

get_means <- function(df, metric, group) {

  metric = enquo(metric)
  group = enquo(group)

  df %>%
    group_by(!!group) %>%
    summarise(!!paste0("mean_", as_label(metric)) := mean(!!metric))
}

get_means(cats, weight, type)

  type    mean_weight
1 fat            20.0
2 not_fat        10.2

get_means(iris, Petal.Width, Species)

  Species    mean_Petal.Width
1 setosa                0.246
2 versicolor            1.33 
3 virginica             2.03


现在添加 ggplot:
get_means <- function(df, metric, group) {

  metric = enquo(metric)
  group = enquo(group)

  df %>%
    group_by(!!group) %>%
    summarise(mean_stat = mean(!!metric)) %>% 
    ggplot(aes(!!group, mean_stat)) + 
      geom_point()
}

get_means(cats, weight, type)

enter image description here

我不确定您想到的是哪种类型的图,但您可以使用 tidy 评估绘制数据和汇总值。例如:
plot_func = function(data, metric, group) {

  metric = enquo(metric)
  group = enquo(group)

  data %>% 
    ggplot(aes(!!group, !!metric)) + 
      geom_point() +
      geom_point(data=. %>% 
                   group_by(!!group) %>%
                   summarise(!!metric := mean(!!metric)),
                 shape="_", colour="red", size=8) + 
      expand_limits(y=0) +
      scale_y_continuous(expand=expand_scale(mult=c(0,0.02)))
}

plot_func(cats, weight, type)

enter image description here

仅供引用,您可以允许函数使用 ... 参数和 enquos 而不是 enquo(这也需要使用 !!! (unquote-splice) 而不是 !! (unquote))来获取任意数量的分组变量(包括无)。

get_means <- function(df, metric, ...) {

  metric = enquo(metric)
  groups = enquos(...)

  df %>%
    group_by(!!!groups) %>%
    summarise(!!paste0("mean_", quo_text(metric)) := mean(!!metric))
}

get_means(mtcars, mpg, cyl, vs)

    cyl    vs mean_mpg
1     4     0     26  
2     4     1     26.7
3     6     0     20.6
4     6     1     19.1
5     8     0     15.1

get_means(mtcars, mpg)

  mean_mpg
1     20.1

关于r - 在 group_by() %>% mutate() 函数调用中使用带引号的变量,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/55425976/

相关文章:

r - 如何创建一个函数来改变具有变量名和 "_pct"的新列?

r - 通过整洁的评估来改变变量(符号或字符串)

r - R中行的有序分组

r - 将带有日期的列转换为 R 中的行

r - 如何使用dplyr连接多个数据框?

r - 组的滞后变量在 dplyr 中不起作用

r - 在 R 包中使用 tidy eval

python - Python 中 R 的 seq_len 等价物

r - 如何平衡不平衡的面板数据?

r - 有人可以在手动 ggplot 比例尺中解释命名向量的行为吗?