如何将transmute与grep函数结合?

时间:2020-08-10 15:26:19

标签: r dplyr

我正在尝试找到一种方法,使用现有数据框中的rowSums()函数使用变量创建新表。例如,我现有的数据帧称为'asn',我想对变量标题中包含“ 2011”的所有变量的每一行的值求和。我想要一个仅由称为asn_y2011的列组成的新表,其中使用包含“ 2011”的变量来包含每一行的总和

数据

structure(list(row = 1:3, south_2010 = c(1L, 5L, 7L), south_2011 = c(4L, 
0L, 4L), south_2012 = c(5L, 8L, 6L), north_2010 = c(3L, 4L, 1L
), north_2011 = c(2L, 6L, 0L), north_2012 = c(1L, 1L, 2L)), class = "data.frame", row.names = c(NA, 
-3L))

现有的'asn'数据框看起来像这样

row south_2010 south_2011 south_2012 north_2010 north_2011 north_2012
  1      1           4         5          3          2          1
  2      5           0         8          4          6          1
  3      7           4         6          1          0          2

我正在尝试使用以下功能:

asn %>%   
   transmute(asn_y2011 = rowSums(, grep("2011")))

得到这样的东西

row    asn_y2011
 1         6
 2         6
 3         4

5 个答案:

答案 0 :(得分:3)

继续执行代码,grep()应该像这样:

library(dplyr)

asn %>%
  transmute(row, asn_y2011 = rowSums(.[grep("2011", names(.))]))

#   row asn_y2011
# 1   1         6
# 2   2         6
# 3   3         4

或者您可以在c_across()中使用 整洁的选择

asn %>%
  rowwise() %>% 
  transmute(row, asn_y2011 = sum(c_across(contains("2011")))) %>%
  ungroup()

答案 1 :(得分:3)

使用rowSums

的另一个基本R选项
cbind(asn[1],asn_y2011 = rowSums(asn[grep("2011",names(asn))]))

给出

  row asn_y2011
1   1         6
2   2         6
3   3         4

答案 2 :(得分:2)

base R中带有Reduce的选项

cbind(df['row'], asn_y2011 = Reduce(`+`, df[endsWith(names(df), '2011')]))
#  row asn_y2011
#1   1         6
#2   2         6
#3   3         4

数据

df <- structure(list(row = 1:3, south_2010 = c(1L, 5L, 7L), south_2011 = c(4L, 
0L, 4L), south_2012 = c(5L, 8L, 6L), north_2010 = c(3L, 4L, 1L
), north_2011 = c(2L, 6L, 0L), north_2012 = c(1L, 1L, 2L)), 
class = "data.frame", row.names = c(NA, 
-3L))

答案 3 :(得分:0)

我认为这段代码可以满足您的要求:

library(magrittr)
tibble::tibble(row = 1:3, south_2011 = c(4, 0, 4), north_2011 = c(2, 6, 0)) %>%
  tidyr::gather(- row, key = "key", value = "value") %>%
  dplyr::mutate(year = purrr::map_chr(.x = key, .f = function(x)stringr::str_split(x, pattern = "_")[[1]][2])) %>%
  dplyr::group_by(row, year) %>%
  dplyr::summarise(sum(value))

我首先加载软件包magrittr,以便可以使用管道%>%。我已经明确列出了从中导出函数的软件包,但是如果愿意,欢迎您使用library加载软件包。

然后我像您指定的那样创建一个小标题或数据框。

在创建新变量gather之前,我使用year重组了数据框。然后,我根据rowyear的值总结计数。

答案 4 :(得分:0)

您可以尝试这种方法

library(tidyverse)
df2 <- df %>% 
  select(grep("_2011|row", names(df), value = TRUE)) %>% 
  rowwise() %>% 
  mutate(asn_y2011 = sum(c_across(south_2011:north_2011))) %>% 
  select(row, asn_y2011)
  
#     row asn_y2011
#   <int>     <int>
# 1     1         6
# 2     2         6
# 3     3         4

数据

df <- structure(list(row = 1:3, south_2010 = c(1L, 5L, 7L), south_2011 = c(4L, 0L, 4L), south_2012 = c(5L, 8L, 6L), north_2010 = c(3L, 4L, 1L), north_2011 = c(2L, 6L, 0L), north_2012 = c(1L, 1L, 2L)), class = "data.frame", row.names = c(NA,-3L))