I'm sure there is a simple way to create a new column with mutate
aggregating many columns at once. So, for a tibble
library(tidyverse)
tbl <- tibble(a = 1:3, ab = 1:3 * 2, b = letters[1:3]) %T>% print()
#> # A tibble: 3 x 3
#> a ab b
#> <int> <dbl> <chr>
#> 1 1 2 a
#> 2 2 4 b
#> 3 3 6 c
apply something like
tbl %>% mutate(aggr_column = sum(vars(starts_with("a")))
and get aggr_column
with values c(3, 6, 9)