Import your data

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

species <- readr::read_csv('https://raw.githubusercontent.com/rfordatascience/tidytuesday/main/data/2024/2024-10-08/most_visited_nps_species_data.csv')
## Warning: One or more parsing issues, call `problems()` on your data frame for details,
## e.g.:
##   dat <- vroom(...)
##   problems(dat)
## Rows: 61119 Columns: 28
## ── Column specification ────────────────────────────────────────────────────────
## Delimiter: ","
## chr (21): ParkCode, ParkName, CategoryName, Order, Family, TaxonRecordStatus...
## dbl  (3): References, Observations, Vouchers
## lgl  (4): Synonyms, ParkAccepted, Sensitive, ExternalLinks
## 
## ℹ Use `spec()` to retrieve the full column specification for this data.
## ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
species
## # A tibble: 61,119 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 ACAD     Acadia National… Mammal       Arti… Cervi… Active            Alces …
##  2 ACAD     Acadia National… Mammal       Arti… Cervi… Active            Odocoi…
##  3 ACAD     Acadia National… Mammal       Carn… Canid… Active            Canis …
##  4 ACAD     Acadia National… Mammal       Carn… Canid… Active            Canis …
##  5 ACAD     Acadia National… Mammal       Carn… Canid… Active            Vulpes…
##  6 ACAD     Acadia National… Mammal       Carn… Felid… Active            Lynx c…
##  7 ACAD     Acadia National… Mammal       Carn… Felid… Active            Lynx r…
##  8 ACAD     Acadia National… Mammal       Carn… Mephi… Active            Mephit…
##  9 ACAD     Acadia National… Mammal       Carn… Muste… Active            Lutra …
## 10 ACAD     Acadia National… Mammal       Carn… Muste… Active            Martes…
## # ℹ 61,109 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>

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
# Adding an argument
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 values in columns
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 it into a list of data frames
    split(.$cyl) %>%
    
    # Repeat regression over each group
    map(~lm(formula = mpg ~ wt, data = .x)) %>%
    
    # Extract coefficients from regression results
    map(broom::tidy, conf.int = TRUE) %>%
    
    # Convert to tibble
    bind_rows(.id = "cyl") %>%
    
    # Filter for wt coefficients
    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

species_tbl <- species %>%
    
    # Split it into a list of data frames
    split(.$ParkName)
    
    # Repeat regression over each group
    #map(~lm(formula = mpg ~ wt, data = .x)) %>%
    
    # Extract coefficients from regression results
    #map(broom::tidy, conf.int = TRUE) %>%
    
    # Convert to tibble
    #bind_rows(.id = "cyl") %>%
    
    # Filter for wt coefficients
    #filter(term == "wt")

species_tbl
## $`Acadia National Park`
## # A tibble: 1,709 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 ACAD     Acadia National… Mammal       Arti… Cervi… Active            Alces …
##  2 ACAD     Acadia National… Mammal       Arti… Cervi… Active            Odocoi…
##  3 ACAD     Acadia National… Mammal       Carn… Canid… Active            Canis …
##  4 ACAD     Acadia National… Mammal       Carn… Canid… Active            Canis …
##  5 ACAD     Acadia National… Mammal       Carn… Canid… Active            Vulpes…
##  6 ACAD     Acadia National… Mammal       Carn… Felid… Active            Lynx c…
##  7 ACAD     Acadia National… Mammal       Carn… Felid… Active            Lynx r…
##  8 ACAD     Acadia National… Mammal       Carn… Mephi… Active            Mephit…
##  9 ACAD     Acadia National… Mammal       Carn… Muste… Active            Lutra …
## 10 ACAD     Acadia National… Mammal       Carn… Muste… Active            Martes…
## # ℹ 1,699 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Bryce Canyon National Park`
## # A tibble: 1,287 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 BRCA     Bryce Canyon Na… Mammal       Arti… Antil… Active            Antilo…
##  2 BRCA     Bryce Canyon Na… Mammal       Arti… Bovid… Active            Oreamn…
##  3 BRCA     Bryce Canyon Na… Mammal       Arti… Bovid… Active            Ovis c…
##  4 BRCA     Bryce Canyon Na… Mammal       Arti… Cervi… Inactive          Cervus…
##  5 BRCA     Bryce Canyon Na… Mammal       Arti… Cervi… Active            Odocoi…
##  6 BRCA     Bryce Canyon Na… Mammal       Carn… Canid… Active            Canis …
##  7 BRCA     Bryce Canyon Na… Mammal       Carn… Canid… Active            Urocyo…
##  8 BRCA     Bryce Canyon Na… Mammal       Carn… Canid… Active            Vulpes…
##  9 BRCA     Bryce Canyon Na… Mammal       Carn… Canid… Active            Vulpes…
## 10 BRCA     Bryce Canyon Na… Mammal       Carn… Felid… Active            Lynx c…
## # ℹ 1,277 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Cuyahoga Valley National Park`
## # A tibble: 1,942 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 CUVA     Cuyahoga Valley… Mammal       Arti… Cervi… Active            Odocoi…
##  2 CUVA     Cuyahoga Valley… Mammal       Carn… Canid… Active            Canis …
##  3 CUVA     Cuyahoga Valley… Mammal       Carn… Canid… Active            Urocyo…
##  4 CUVA     Cuyahoga Valley… Mammal       Carn… Canid… Active            Vulpes…
##  5 CUVA     Cuyahoga Valley… Mammal       Carn… Felid… Active            Lynx r…
##  6 CUVA     Cuyahoga Valley… Mammal       Carn… Mephi… Active            Mephit…
##  7 CUVA     Cuyahoga Valley… Mammal       Carn… Muste… Active            Lontra…
##  8 CUVA     Cuyahoga Valley… Mammal       Carn… Muste… Active            Mustel…
##  9 CUVA     Cuyahoga Valley… Mammal       Carn… Muste… Active            Mustel…
## 10 CUVA     Cuyahoga Valley… Mammal       Carn… Muste… Active            Mustel…
## # ℹ 1,932 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Glacier National Park`
## # A tibble: 2,559 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 GLAC     Glacier Nationa… Mammal       <NA>  <NA>   Active            Clethr…
##  2 GLAC     Glacier Nationa… Mammal       Arti… Bovid… Active            Bison …
##  3 GLAC     Glacier Nationa… Mammal       Arti… Bovid… Active            Oreamn…
##  4 GLAC     Glacier Nationa… Mammal       Arti… Bovid… Active            Ovis c…
##  5 GLAC     Glacier Nationa… Mammal       Arti… Cervi… Active            Alces …
##  6 GLAC     Glacier Nationa… Mammal       Arti… Cervi… Active            Cervus…
##  7 GLAC     Glacier Nationa… Mammal       Arti… Cervi… Active            Odocoi…
##  8 GLAC     Glacier Nationa… Mammal       Arti… Cervi… Active            Odocoi…
##  9 GLAC     Glacier Nationa… Mammal       Arti… Cervi… Active            Rangif…
## 10 GLAC     Glacier Nationa… Mammal       Carn… Canid… Active            Canis …
## # ℹ 2,549 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Grand Canyon National Park`
## # A tibble: 2,708 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 GRCA     Grand Canyon Na… Mammal       Arti… Antil… Active            Antilo…
##  2 GRCA     Grand Canyon Na… Mammal       Arti… Bovid… Active            Bison …
##  3 GRCA     Grand Canyon Na… Mammal       Arti… Bovid… Active            Ovis c…
##  4 GRCA     Grand Canyon Na… Mammal       Arti… Cervi… Active            Cervus…
##  5 GRCA     Grand Canyon Na… Mammal       Arti… Cervi… Active            Odocoi…
##  6 GRCA     Grand Canyon Na… Mammal       Arti… Tayas… Active            Pecari…
##  7 GRCA     Grand Canyon Na… Mammal       Carn… Canid… Active            Canis …
##  8 GRCA     Grand Canyon Na… Mammal       Carn… Canid… Active            Canis …
##  9 GRCA     Grand Canyon Na… Mammal       Carn… Canid… Active            Urocyo…
## 10 GRCA     Grand Canyon Na… Mammal       Carn… Canid… Active            Vulpes…
## # ℹ 2,698 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Grand Teton National Park`
## # A tibble: 2,247 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 GRTE     Grand Teton Nat… Mammal       Arti… Antil… Active            Antilo…
##  2 GRTE     Grand Teton Nat… Mammal       Arti… Bovid… Active            Bos bi…
##  3 GRTE     Grand Teton Nat… Mammal       Arti… Bovid… Active            Oreamn…
##  4 GRTE     Grand Teton Nat… Mammal       Arti… Bovid… Active            Ovis c…
##  5 GRTE     Grand Teton Nat… Mammal       Arti… Cervi… Active            Alces …
##  6 GRTE     Grand Teton Nat… Mammal       Arti… Cervi… Active            Cervus…
##  7 GRTE     Grand Teton Nat… Mammal       Arti… Cervi… Active            Odocoi…
##  8 GRTE     Grand Teton Nat… Mammal       Arti… Cervi… Active            Odocoi…
##  9 GRTE     Grand Teton Nat… Mammal       Carn… Canid… Active            Canis …
## 10 GRTE     Grand Teton Nat… Mammal       Carn… Canid… Active            Canis …
## # ℹ 2,237 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Great Smoky Mountains National Park`
## # A tibble: 28,670 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 GRSM     Great Smoky Mou… Mammal       Arti… Bovid… Active            Bison …
##  2 GRSM     Great Smoky Mou… Mammal       Arti… Bovid… Active            Bos bi…
##  3 GRSM     Great Smoky Mou… Mammal       Arti… Bovid… Active            Bos ta…
##  4 GRSM     Great Smoky Mou… Mammal       Arti… Bovid… Active            Ovis a…
##  5 GRSM     Great Smoky Mou… Mammal       Arti… Cervi… Active            Cervus…
##  6 GRSM     Great Smoky Mou… Mammal       Arti… Cervi… Active            Odocoi…
##  7 GRSM     Great Smoky Mou… Mammal       Arti… Suidae Active            Sus sc…
##  8 GRSM     Great Smoky Mou… Mammal       Carn… Canid… Active            Canis …
##  9 GRSM     Great Smoky Mou… Mammal       Carn… Canid… Active            Canis …
## 10 GRSM     Great Smoky Mou… Mammal       Carn… Canid… Active            Canis …
## # ℹ 28,660 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Hot Springs National Park`
## # A tibble: 1,972 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 HOSP     Hot Springs Nat… Mammal       Arti… Cervi… Active            Odocoi…
##  2 HOSP     Hot Springs Nat… Mammal       Carn… Canid… Active            Canis …
##  3 HOSP     Hot Springs Nat… Mammal       Carn… Canid… Active            Canis …
##  4 HOSP     Hot Springs Nat… Mammal       Carn… Canid… Active            Urocyo…
##  5 HOSP     Hot Springs Nat… Mammal       Carn… Canid… Active            Vulpes…
##  6 HOSP     Hot Springs Nat… Mammal       Carn… Felid… Active            Felis …
##  7 HOSP     Hot Springs Nat… Mammal       Carn… Felid… Active            Lynx r…
##  8 HOSP     Hot Springs Nat… Mammal       Carn… Mephi… Active            Mephit…
##  9 HOSP     Hot Springs Nat… Mammal       Carn… Mephi… Active            Spilog…
## 10 HOSP     Hot Springs Nat… Mammal       Carn… Muste… Active            Lontra…
## # ℹ 1,962 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Indiana Dunes National Park`
## # A tibble: 2,484 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 INDU     Indiana Dunes N… Mammal       Arti… Bovid… Active            Bison …
##  2 INDU     Indiana Dunes N… Mammal       Arti… Cervi… Active            Cervus…
##  3 INDU     Indiana Dunes N… Mammal       Arti… Cervi… Active            Odocoi…
##  4 INDU     Indiana Dunes N… Mammal       Carn… Canid… Active            Canis …
##  5 INDU     Indiana Dunes N… Mammal       Carn… Canid… Active            Canis …
##  6 INDU     Indiana Dunes N… Mammal       Carn… Canid… Active            Canis …
##  7 INDU     Indiana Dunes N… Mammal       Carn… Canid… Active            Canis …
##  8 INDU     Indiana Dunes N… Mammal       Carn… Canid… Active            Urocyo…
##  9 INDU     Indiana Dunes N… Mammal       Carn… Canid… Active            Vulpes…
## 10 INDU     Indiana Dunes N… Mammal       Carn… Felid… Active            Felis …
## # ℹ 2,474 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Joshua Tree National Park`
## # A tibble: 2,317 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 JOTR     Joshua Tree Nat… Mammal       Arti… Bovid… Active            Ovis a…
##  2 JOTR     Joshua Tree Nat… Mammal       Arti… Bovid… Inactive          Ovis c…
##  3 JOTR     Joshua Tree Nat… Mammal       Arti… Bovid… Inactive          Ovis c…
##  4 JOTR     Joshua Tree Nat… Mammal       Arti… Cervi… Active            Odocoi…
##  5 JOTR     Joshua Tree Nat… Mammal       Carn… Canid… Active            Canis …
##  6 JOTR     Joshua Tree Nat… Mammal       Carn… Canid… Active            Urocyo…
##  7 JOTR     Joshua Tree Nat… Mammal       Carn… Canid… Active            Vulpes…
##  8 JOTR     Joshua Tree Nat… Mammal       Carn… Felid… Active            Lynx r…
##  9 JOTR     Joshua Tree Nat… Mammal       Carn… Felid… Active            Puma c…
## 10 JOTR     Joshua Tree Nat… Mammal       Carn… Mephi… Active            Spilog…
## # ℹ 2,307 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Olympic National Park`
## # A tibble: 1,947 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 OLYM     Olympic Nationa… Mammal       Arti… Bovid… Active            Oreamn…
##  2 OLYM     Olympic Nationa… Mammal       Arti… Cervi… Active            Cervus…
##  3 OLYM     Olympic Nationa… Mammal       Arti… Cervi… Active            Odocoi…
##  4 OLYM     Olympic Nationa… Mammal       Arti… Cervi… Active            Odocoi…
##  5 OLYM     Olympic Nationa… Mammal       Arti… Suidae Active            Sus sc…
##  6 OLYM     Olympic Nationa… Mammal       Carn… Canid… Active            Canis …
##  7 OLYM     Olympic Nationa… Mammal       Carn… Canid… Active            Canis …
##  8 OLYM     Olympic Nationa… Mammal       Carn… Canid… Active            Vulpes…
##  9 OLYM     Olympic Nationa… Mammal       Carn… Felid… Active            Lynx r…
## 10 OLYM     Olympic Nationa… Mammal       Carn… Felid… Active            Puma c…
## # ℹ 1,937 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Rocky Mountain National Park`
## # A tibble: 3,213 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 ROMO     Rocky Mountain … Mammal       Arti… Antil… Active            Antilo…
##  2 ROMO     Rocky Mountain … Mammal       Arti… Bovid… Active            Bos bi…
##  3 ROMO     Rocky Mountain … Mammal       Arti… Bovid… Active            Bos ta…
##  4 ROMO     Rocky Mountain … Mammal       Arti… Bovid… Active            Oreamn…
##  5 ROMO     Rocky Mountain … Mammal       Arti… Bovid… Active            Ovis c…
##  6 ROMO     Rocky Mountain … Mammal       Arti… Cervi… Active            Alces …
##  7 ROMO     Rocky Mountain … Mammal       Arti… Cervi… Active            Cervus…
##  8 ROMO     Rocky Mountain … Mammal       Arti… Cervi… Active            Odocoi…
##  9 ROMO     Rocky Mountain … Mammal       Arti… Cervi… Active            Odocoi…
## 10 ROMO     Rocky Mountain … Mammal       Carn… Canid… Active            Canis …
## # ℹ 3,203 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Yellowstone National Park`
## # A tibble: 4,179 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 YELL     Yellowstone Nat… Mammal       Arti… Antil… Active            Antilo…
##  2 YELL     Yellowstone Nat… Mammal       Arti… Bovid… Active            Bison …
##  3 YELL     Yellowstone Nat… Mammal       Arti… Bovid… Active            Oreamn…
##  4 YELL     Yellowstone Nat… Mammal       Arti… Bovid… Active            Ovis c…
##  5 YELL     Yellowstone Nat… Mammal       Arti… Cervi… Active            Alces …
##  6 YELL     Yellowstone Nat… Mammal       Arti… Cervi… Active            Alces …
##  7 YELL     Yellowstone Nat… Mammal       Arti… Cervi… Active            Cervus…
##  8 YELL     Yellowstone Nat… Mammal       Arti… Cervi… Active            Odocoi…
##  9 YELL     Yellowstone Nat… Mammal       Arti… Cervi… Active            Odocoi…
## 10 YELL     Yellowstone Nat… Mammal       Carn… Canid… Active            Canis …
## # ℹ 4,169 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Yosemite National Park`
## # A tibble: 2,086 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 YOSE     Yosemite Nation… Mammal       Arti… Bovid… Active            Ovis c…
##  2 YOSE     Yosemite Nation… Mammal       Arti… Cervi… Active            Cervus…
##  3 YOSE     Yosemite Nation… Mammal       Arti… Cervi… Active            Odocoi…
##  4 YOSE     Yosemite Nation… Mammal       Arti… Suidae Active            Sus sc…
##  5 YOSE     Yosemite Nation… Mammal       Carn… Canid… Active            Canis …
##  6 YOSE     Yosemite Nation… Mammal       Carn… Canid… Active            Canis …
##  7 YOSE     Yosemite Nation… Mammal       Carn… Canid… Active            Urocyo…
##  8 YOSE     Yosemite Nation… Mammal       Carn… Canid… Active            Vulpes…
##  9 YOSE     Yosemite Nation… Mammal       Carn… Felid… Active            Lynx r…
## 10 YOSE     Yosemite Nation… Mammal       Carn… Felid… Active            Puma c…
## # ℹ 2,076 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>
## 
## $`Zion National Park`
## # A tibble: 1,799 × 28
##    ParkCode ParkName         CategoryName Order Family TaxonRecordStatus SciName
##    <chr>    <chr>            <chr>        <chr> <chr>  <chr>             <chr>  
##  1 ZION     Zion National P… Mammal       Arti… Bovid… Active            Ovis c…
##  2 ZION     Zion National P… Mammal       Arti… Cervi… Inactive          Cervus…
##  3 ZION     Zion National P… Mammal       Arti… Cervi… Active            Odocoi…
##  4 ZION     Zion National P… Mammal       Carn… Canid… Active            Canis …
##  5 ZION     Zion National P… Mammal       Carn… Canid… Active            Urocyo…
##  6 ZION     Zion National P… Mammal       Carn… Canid… Active            Vulpes…
##  7 ZION     Zion National P… Mammal       Carn… Canid… Active            Vulpes…
##  8 ZION     Zion National P… Mammal       Carn… Felid… Active            Lynx r…
##  9 ZION     Zion National P… Mammal       Carn… Felid… Active            Puma c…
## 10 ZION     Zion National P… Mammal       Carn… Mephi… Active            Mephit…
## # ℹ 1,789 more rows
## # ℹ 21 more variables: CommonNames <chr>, Synonyms <lgl>, ParkAccepted <lgl>,
## #   Sensitive <lgl>, RecordStatus <chr>, Occurrence <chr>,
## #   OccurrenceTags <chr>, Nativeness <chr>, NativenessTags <chr>,
## #   Abundance <chr>, NPSTags <chr>, ParkTags <chr>, References <dbl>,
## #   Observations <dbl>, Vouchers <dbl>, ExternalLinks <lgl>, TEStatus <chr>,
## #   StateStatus <chr>, OzoneSensitiveStatus <chr>, GRank <chr>, SRank <chr>