gpt4 book ai didi

r - 在一个函数中分布多个列

转载 作者:行者123 更新时间:2023-12-04 22:56:08 25 4
gpt4 key购买 nike

我经常需要 spread 多个值列,如 this 问题。但是我经常这样做,以至于我希望能够编写一个执行此操作的函数。

例如,给定数据:

set.seed(42)
dat <- data_frame(id = rep(1:2,each = 2),
grp = rep(letters[1:2],times = 2),
avg = rnorm(4),
sd = runif(4))
> dat
# A tibble: 4 x 4
id grp avg sd
<int> <chr> <dbl> <dbl>
1 1 a 1.3709584 0.6569923
2 1 b -0.5646982 0.7050648
3 2 a 0.3631284 0.4577418
4 2 b 0.6328626 0.7191123

我想创建一个返回如下内容的函数:
# A tibble: 2 x 5
id a_avg b_avg a_sd b_sd
<int> <dbl> <dbl> <dbl> <dbl>
1 1 1.3709584 -0.5646982 0.6569923 0.7050648
2 2 0.3631284 0.6328626 0.4577418 0.7191123

我怎样才能做到这一点?

最佳答案

我们将回到链接到的问题中提供的答案,但目前让我们从更幼稚的方法开始。

一个想法是单独对每个值列进行 spread,然后加入结果,即

library(dplyr)
library(tidyr)
library(tibble)

dat_avg <- dat %>%
select(-sd) %>%
spread(key = grp,value = avg) %>%
rename(a_avg = a,
b_avg = b)

dat_sd <- dat %>%
select(-avg) %>%
spread(key = grp,value = sd) %>%
rename(a_sd = a,
b_sd = b)

> full_join(dat_avg,
dat_sd,
by = 'id')

# A tibble: 2 x 5
id a_avg b_avg a_sd b_sd
<int> <dbl> <dbl> <dbl> <dbl>
1 1 1.3709584 -0.5646982 0.6569923 0.7050648
2 2 0.3631284 0.6328626 0.4577418 0.7191123

(我使用了 full_join 以防万一我们遇到了并非所有连接列组合都出现在所有这些组合中的情况。)

让我们从一个类似于 spread 的函数开始,但允许您将 keyvalue 列作为字符传递:
spread_chr <- function(data, key_col, value_cols, fill = NA, 
convert = FALSE,drop = TRUE,sep = NULL){
n_val <- length(value_cols)
result <- vector(mode = "list", length = n_val)
id_cols <- setdiff(names(data), c(key_col,value_cols))

for (i in seq_along(result)){
result[[i]] <- spread(data = data[,c(id_cols,key_col,value_cols[i]),drop = FALSE],
key = !!key_col,
value = !!value_cols[i],
fill = fill,
convert = convert,
drop = drop,
sep = paste0(sep,value_cols[i],sep))
}

result %>%
purrr::reduce(.f = full_join, by = id_cols)
}

> dat %>%
spread_chr(key_col = "grp",
value_cols = c("avg","sd"),
sep = "_")

# A tibble: 2 x 5
id grp_avg_a grp_avg_b grp_sd_a grp_sd_b
<int> <dbl> <dbl> <dbl> <dbl>
1 1 1.3709584 -0.5646982 0.6569923 0.7050648
2 2 0.3631284 0.6328626 0.4577418 0.7191123

这里的关键思想是使用 key_col 运算符取消引用参数 value_cols[i]!!,并使用 sep 中的 spread 参数来控制结果值列名称。

如果我们想将此函数转换为接受键和值列的不带引号的参数,我们可以像这样修改它:
spread_nq <- function(data, key_col,..., fill = NA, 
convert = FALSE, drop = TRUE, sep = NULL){
val_quos <- rlang::quos(...)
key_quo <- rlang::enquo(key_col)
value_cols <- unname(tidyselect::vars_select(names(data),!!!val_quos))
key_col <- unname(tidyselect::vars_select(names(data),!!key_quo))

n_val <- length(value_cols)
result <- vector(mode = "list",length = n_val)
id_cols <- setdiff(names(data),c(key_col,value_cols))

for (i in seq_along(result)){
result[[i]] <- spread(data = data[,c(id_cols,key_col,value_cols[i]),drop = FALSE],
key = !!key_col,
value = !!value_cols[i],
fill = fill,
convert = convert,
drop = drop,
sep = paste0(sep,value_cols[i],sep))
}

result %>%
purrr::reduce(.f = full_join,by = id_cols)
}

> dat %>%
spread_nq(key_col = grp,avg,sd,sep = "_")

# A tibble: 2 x 5
id grp_avg_a grp_avg_b grp_sd_a grp_sd_b
<int> <dbl> <dbl> <dbl> <dbl>
1 1 1.3709584 -0.5646982 0.6569923 0.7050648
2 2 0.3631284 0.6328626 0.4577418 0.7191123

这里的变化是我们使用 rlang::quosrlang::enquo 捕获未加引号的参数,然后使用 tidyselect::vars_select 将它们简单地转换回字符。

回到使用 gatherunitespread 序列的链接问题中的解决方案,我们可以使用我们学到的知识来制作这样的函数:
spread_nt <- function(data,key_col,...,fill = NA,
convert = TRUE,drop = TRUE,sep = "_"){
key_quo <- rlang::enquo(key_col)
val_quos <- rlang::quos(...)
value_cols <- unname(tidyselect::vars_select(names(data),!!!val_quos))
key_col <- unname(tidyselect::vars_select(names(data),!!key_quo))

data %>%
gather(key = ..var..,value = ..val..,!!!val_quos) %>%
unite(col = ..grp..,c(key_col,"..var.."),sep = sep) %>%
spread(key = ..grp..,value = ..val..,fill = fill,
convert = convert,drop = drop,sep = NULL)
}

> dat %>%
spread_nt(key_col = grp,avg,sd,sep = "_")

# A tibble: 2 x 5
id a_avg a_sd b_avg b_sd
* <int> <dbl> <dbl> <dbl> <dbl>
1 1 1.3709584 0.6569923 -0.5646982 0.7050648
2 2 0.3631284 0.4577418 0.6328626 0.7191123

这依赖于上一个示例中 rlang 的相同技术。我们为中间变量使用了一些不寻常的名称,例如 ..var..,以减少与数据框中现有列发生名称冲突的可能性。

此外,我们在 sep 中使用 unite 参数来控制结果列名,所以在这种情况下,当我们 spread 时,我们强制 sep = NULL

关于r - 在一个函数中分布多个列,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/46009802/

25 4 0
Copyright 2021 - 2024 cfsdn All Rights Reserved 蜀ICP备2022000587号
广告合作:1813099741@qq.com 6ren.com