Import your data

data("mtcars")
mtcars <- as_tibble(mtcars)

myData <- read_excel("data/myData.xlsx")
myData
## # A tibble: 2,973 × 10
##    name     state state_code type  degree_length room_and_board in_state_tuition
##    <chr>    <chr> <chr>      <chr> <chr>         <chr>                     <dbl>
##  1 Aaniiih… Mont… MT         Publ… 2 Year        NA                         2380
##  2 Abilene… Texas TX         Priv… 4 Year        10350                     34850
##  3 Abraham… Geor… GA         Publ… 2 Year        8474                       4128
##  4 Academy… Minn… MN         For … 2 Year        NA                        17661
##  5 Academy… Cali… CA         For … 4 Year        16648                     27810
##  6 Adams S… Colo… CO         Publ… 4 Year        8782                       9440
##  7 Adelphi… New … NY         Priv… 4 Year        16030                     38660
##  8 Adirond… New … NY         Publ… 2 Year        11660                      5375
##  9 Adrian … Mich… MI         Priv… 4 Year        11318                     37087
## 10 Advance… Virg… VA         For … 2 Year        NA                        13680
## # ℹ 2,963 more rows
## # ℹ 3 more variables: in_state_total <dbl>, out_of_state_tuition <dbl>,
## #   out_of_state_total <dbl>

Repeat the same operation over different columns of a data frame

Case of numeric variables

mtcars %>% map_dbl(.x = ., .f = ~mean(x = .x))
##        mpg        cyl       disp         hp       drat         wt       qsec 
##  20.090625   6.187500 230.721875 146.687500   3.596563   3.217250  17.848750 
##         vs         am       gear       carb 
##   0.437500   0.406250   3.687500   2.812500
mtcars %>% map_dbl(.f = ~mean(x = .x))
##        mpg        cyl       disp         hp       drat         wt       qsec 
##  20.090625   6.187500 230.721875 146.687500   3.596563   3.217250  17.848750 
##         vs         am       gear       carb 
##   0.437500   0.406250   3.687500   2.812500
mtcars %>% map_dbl(mean)
##        mpg        cyl       disp         hp       drat         wt       qsec 
##  20.090625   6.187500 230.721875 146.687500   3.596563   3.217250  17.848750 
##         vs         am       gear       carb 
##   0.437500   0.406250   3.687500   2.812500
mtcars %>% map_dbl(.x = ., .f = ~mean(x = .x, trim = 0.1))
##         mpg         cyl        disp          hp        drat          wt 
##  19.6961538   6.2307692 222.5230769 141.1923077   3.5792308   3.1526923 
##        qsec          vs          am        gear        carb 
##  17.8276923   0.4230769   0.3846154   3.6153846   2.6538462
mtcars %>% map_dbl(mean, trim = 0.1)
##         mpg         cyl        disp          hp        drat          wt 
##  19.6961538   6.2307692 222.5230769 141.1923077   3.5792308   3.1526923 
##        qsec          vs          am        gear        carb 
##  17.8276923   0.4230769   0.3846154   3.6153846   2.6538462
mtcars %>% select(.data = ., mpg)
## # A tibble: 32 × 1
##      mpg
##    <dbl>
##  1  21  
##  2  21  
##  3  22.8
##  4  21.4
##  5  18.7
##  6  18.1
##  7  14.3
##  8  24.4
##  9  22.8
## 10  19.2
## # ℹ 22 more rows
mtcars %>% select(mpg)
## # A tibble: 32 × 1
##      mpg
##    <dbl>
##  1  21  
##  2  21  
##  3  22.8
##  4  21.4
##  5  18.7
##  6  18.1
##  7  14.3
##  8  24.4
##  9  22.8
## 10  19.2
## # ℹ 22 more rows

Create your own function

double_by_factor <- function(x, factor) {x * factor}
10 %>% double_by_factor(factor = 2)
## [1] 20
mtcars %>% map_dfr(.x = ., .f = ~double_by_factor(x = .x, factor = 10))
## # A tibble: 32 × 11
##      mpg   cyl  disp    hp  drat    wt  qsec    vs    am  gear  carb
##    <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
##  1   210    60  1600  1100  39    26.2  165.     0    10    40    40
##  2   210    60  1600  1100  39    28.8  170.     0    10    40    40
##  3   228    40  1080   930  38.5  23.2  186.    10    10    40    10
##  4   214    60  2580  1100  30.8  32.2  194.    10     0    30    10
##  5   187    80  3600  1750  31.5  34.4  170.     0     0    30    20
##  6   181    60  2250  1050  27.6  34.6  202.    10     0    30    10
##  7   143    80  3600  2450  32.1  35.7  158.     0     0    30    40
##  8   244    40  1467   620  36.9  31.9  200     10     0    40    20
##  9   228    40  1408   950  39.2  31.5  229     10     0    40    20
## 10   192    60  1676  1230  39.2  34.4  183     10     0    40    40
## # ℹ 22 more rows
mtcars %>% map_dfr(double_by_factor, factor = 10)
## # A tibble: 32 × 11
##      mpg   cyl  disp    hp  drat    wt  qsec    vs    am  gear  carb
##    <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl> <dbl>
##  1   210    60  1600  1100  39    26.2  165.     0    10    40    40
##  2   210    60  1600  1100  39    28.8  170.     0    10    40    40
##  3   228    40  1080   930  38.5  23.2  186.    10    10    40    10
##  4   214    60  2580  1100  30.8  32.2  194.    10     0    30    10
##  5   187    80  3600  1750  31.5  34.4  170.     0     0    30    20
##  6   181    60  2250  1050  27.6  34.6  202.    10     0    30    10
##  7   143    80  3600  2450  32.1  35.7  158.     0     0    30    40
##  8   244    40  1467   620  36.9  31.9  200     10     0    40    20
##  9   228    40  1408   950  39.2  31.5  229     10     0    40    20
## 10   192    60  1676  1230  39.2  34.4  183     10     0    40    40
## # ℹ 22 more rows

Repeat the same operation over different elements of a list

When you have a grouping variable (factor)

mtcars %>% lm(formula = mpg ~wt, data = .)
## 
## Call:
## lm(formula = mpg ~ wt, data = .)
## 
## Coefficients:
## (Intercept)           wt  
##      37.285       -5.344
mtcars %>% distinct(cyl)
## # A tibble: 3 × 1
##     cyl
##   <dbl>
## 1     6
## 2     4
## 3     8
reg_coeff_tbl <- mtcars %>%
    split(.$cyl) %>%
    
    map(~lm(formula = mpg ~ wt, data = .x)) %>%
    
    map(broom::tidy, conf.int = TRUE) %>%
    
    bind_rows(.id = "cyl") %>%
    
    filter(term == "wt")
reg_coeff_tbl %>%
    mutate(estimate = -estimate,
           conf.low = -conf.low,
           conf.high = -conf.high) %>%
    
    ggplot(aes(x = -estimate, y = cyl)) +
    geom_point() +
geom_errorbar(aes(xmin = conf.low, xmax = conf.high))

Create your own

Choose either one of the two cases above and apply it to your data

myData %>% map_dbl(.x = ., .f = ~mean(x = .x))
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
##                 name                state           state_code 
##                   NA                   NA                   NA 
##                 type        degree_length       room_and_board 
##                   NA                   NA                   NA 
##     in_state_tuition       in_state_total out_of_state_tuition 
##             16491.29             22871.73             20532.73 
##   out_of_state_total 
##             26913.16
myData %>% map_dbl(.f = ~mean(x = .x))
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
## Warning in mean.default(x = .x): argument is not numeric or logical: returning
## NA
##                 name                state           state_code 
##                   NA                   NA                   NA 
##                 type        degree_length       room_and_board 
##                   NA                   NA                   NA 
##     in_state_tuition       in_state_total out_of_state_tuition 
##             16491.29             22871.73             20532.73 
##   out_of_state_total 
##             26913.16
myData %>% map_dbl(mean)
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
##                 name                state           state_code 
##                   NA                   NA                   NA 
##                 type        degree_length       room_and_board 
##                   NA                   NA                   NA 
##     in_state_tuition       in_state_total out_of_state_tuition 
##             16491.29             22871.73             20532.73 
##   out_of_state_total 
##             26913.16
myData %>% map_dbl(.x = ., .f = ~mean(x = .x, trim = 0.1))
## Warning in mean.default(x = .x, trim = 0.1): argument is not numeric or
## logical: returning NA
## Warning in mean.default(x = .x, trim = 0.1): argument is not numeric or
## logical: returning NA
## Warning in mean.default(x = .x, trim = 0.1): argument is not numeric or
## logical: returning NA
## Warning in mean.default(x = .x, trim = 0.1): argument is not numeric or
## logical: returning NA
## Warning in mean.default(x = .x, trim = 0.1): argument is not numeric or
## logical: returning NA
## Warning in mean.default(x = .x, trim = 0.1): argument is not numeric or
## logical: returning NA
##                 name                state           state_code 
##                   NA                   NA                   NA 
##                 type        degree_length       room_and_board 
##                   NA                   NA                   NA 
##     in_state_tuition       in_state_total out_of_state_tuition 
##             14349.26             20559.03             19013.98 
##   out_of_state_total 
##             25124.98
myData %>% map_dbl(mean, trim = 0.1)
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
## Warning in mean.default(.x[[i]], ...): argument is not numeric or logical:
## returning NA
##                 name                state           state_code 
##                   NA                   NA                   NA 
##                 type        degree_length       room_and_board 
##                   NA                   NA                   NA 
##     in_state_tuition       in_state_total out_of_state_tuition 
##             14349.26             20559.03             19013.98 
##   out_of_state_total 
##             25124.98
myData %>% select(.data = ., state)
## # A tibble: 2,973 × 1
##    state     
##    <chr>     
##  1 Montana   
##  2 Texas     
##  3 Georgia   
##  4 Minnesota 
##  5 California
##  6 Colorado  
##  7 New York  
##  8 New York  
##  9 Michigan  
## 10 Virginia  
## # ℹ 2,963 more rows
myData %>% select(state_code)
## # A tibble: 2,973 × 1
##    state_code
##    <chr>     
##  1 MT        
##  2 TX        
##  3 GA        
##  4 MN        
##  5 CA        
##  6 CO        
##  7 NY        
##  8 NY        
##  9 MI        
## 10 VA        
## # ℹ 2,963 more rows