Introduction to tidycensus

The tidycensus package is a useful tool for interfacing with the United States Census Bureau APIs within the R environment. You can easily obtain thousands of Census and American Community Survey (ACS) variables from as early as 2005, with attached geometry. Here we’ll learn how to get started with tidycensus, as well as a few tricks for wrangling the data.

I. Getting Started

If you haven’t already, request a Census API key, then activate it with the link you receive in your inbox.

library(sf)
## Warning: package 'sf' was built under R version 4.1.2
## Linking to GEOS 3.9.1, GDAL 3.4.0, PROJ 8.1.1; sf_use_s2() is TRUE
library(tmap)
library(dplyr)
## Warning: package 'dplyr' was built under R version 4.1.2
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
library(purrr)
library(ggplot2)
library(tidyverse)
## ── Attaching packages ─────────────────────────────────────── tidyverse 1.3.1 ──
## ✓ tibble  3.1.6     ✓ stringr 1.4.0
## ✓ tidyr   1.2.0     ✓ forcats 0.5.1
## ✓ readr   2.1.2
## Warning: package 'tidyr' was built under R version 4.1.2
## Warning: package 'readr' was built under R version 4.1.2
## ── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
library(tidycensus)
library(RColorBrewer)

Rather than listing your API key every time you start a new project, consider saving the key to your R environment with the following:

#census_api_key("key", overwrite = FALSE, install = TRUE)

You will probably be accessing decennial census data (available for 2000, 2010, and 2020) or ACS estimates. The American Community Survey (available from 2005-2020) is not a census because it does not survey the entire population. Additionally, ACS estimates are obtained over a period (1-year, 3-year, 5-year). In other words, the 5-year ACS estimate for 2016 would be based on the 2016-2020 ACS data. There is a greater degree of error associated with ACS data than the decennial census, and this error increases with temporal granularity.

In deciding whether to use census data or ACS estimates, consider your specific research question. If your study period is limited to 2010 data, the decennial census would be your best bet. If you are interested in 2007 data, the 2005-2010 ACS estimates may be a better choice. If you are studying a period of years (e.g., 2000-2020), keep in mind that the census and ACS data do not compare perfectly, and you should probably choose only one.

With that in mind, to explore variables available, you will need to specify the year and data source. For decennial data, this can include "sf1" (summary file for 2000 and 2010), "pl" (for 2020), "sf3" or "sf4" (2000 only). For island-specific files, you would use "as", "mp", "gu", or "vi". ACS data can be accessed as "acs1" or "acs5".

v_dec_00 <- load_variables(2000, "sf1", cache = TRUE)
v_acs_10 <- load_variables(2010, "acs5", cache = TRUE)
v_dec_20 <- load_variables(2020, "pl", cache = TRUE)

table(v_dec_20$concept)
## 
##                                      GROUP QUARTERS POPULATION BY MAJOR GROUP QUARTERS TYPE 
##                                                                                          10 
##                                      HISPANIC OR LATINO, AND NOT HISPANIC OR LATINO BY RACE 
##                                                                                          73 
## HISPANIC OR LATINO, AND NOT HISPANIC OR LATINO BY RACE FOR THE POPULATION 18 YEARS AND OVER 
##                                                                                          73 
##                                                                            OCCUPANCY STATUS 
##                                                                                           3 
##                                                                                        RACE 
##                                                                                          71 
##                                                   RACE FOR THE POPULATION 18 YEARS AND OVER 
##                                                                                          71
v_dec_20_race <- v_dec_20 %>%
  filter(concept == "RACE")

To get data, you will use one of two functions to interact with the API — get_acs() and get_decennial(). These functions take geography, which specifies the administrative units of interest; variables, which we discussed above; geometry; and year. For get_decennial(), it will default to the summary file (sf1), unless 2020 is supplied, in which case it will select pl.

Example 1. Basic Data Collection and Plotting

#collecting data
acs_df <- get_acs(geography = "state",
                  variables = c("B01001_001", "B08505D_007"),# "B01001_002"), #total population, total wfh
                  geometry = FALSE,
                  year = 2010)
## Getting data from the 2006-2010 5-year ACS
#cleaning
acs_df_clean <- acs_df %>%
  spread(variable, estimate) %>%
  group_by(GEOID) %>%
  fill(B01001_001, B08505D_007, .direction = "up") %>%
  rename(total = B01001_001, wfh = B08505D_007) %>%
  mutate(wfh_p =  wfh * 10000 / total) %>% 
  drop_na()

#plotting
ggplot(data = acs_df_clean, aes(x = wfh, y = reorder(NAME, wfh))) +
  geom_errorbarh(aes(xmin = wfh - moe, xmax = wfh + moe)) +
  geom_point(color = "cyan4", size = 2.5, alpha = 0.75, pch = 18) +
  labs(title = "People Working From Home per 10K",
       subtitle = "2006-2010 American Community Survey",
       y = "",
       x = "ACS estimate (bars represent margin of error)") +
   theme(text = element_text(size = 8))

Example 2. Basic Mapping

df <- get_decennial(geography = "county",
                    variables = c("P5_001N", "P5_002N"), #total population, total institutionalized population
                    geometry = TRUE,
                    year = 2020)
## Getting data from the 2020 decennial Census
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## Using the PL 94-171 Redistricting Data summary file
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |                                                                      |   1%
  |                                                                            
  |=                                                                     |   1%
  |                                                                            
  |=                                                                     |   2%
  |                                                                            
  |==                                                                    |   2%
  |                                                                            
  |==                                                                    |   3%
  |                                                                            
  |==                                                                    |   4%
  |                                                                            
  |===                                                                   |   4%
  |                                                                            
  |===                                                                   |   5%
  |                                                                            
  |====                                                                  |   5%
  |                                                                            
  |====                                                                  |   6%
  |                                                                            
  |=====                                                                 |   7%
  |                                                                            
  |=====                                                                 |   8%
  |                                                                            
  |======                                                                |   8%
  |                                                                            
  |======                                                                |   9%
  |                                                                            
  |=======                                                               |   9%
  |                                                                            
  |=======                                                               |  10%
  |                                                                            
  |=======                                                               |  11%
  |                                                                            
  |========                                                              |  11%
  |                                                                            
  |========                                                              |  12%
  |                                                                            
  |=========                                                             |  12%
  |                                                                            
  |=========                                                             |  13%
  |                                                                            
  |==========                                                            |  14%
  |                                                                            
  |==========                                                            |  15%
  |                                                                            
  |===========                                                           |  15%
  |                                                                            
  |===========                                                           |  16%
  |                                                                            
  |============                                                          |  17%
  |                                                                            
  |=============                                                         |  18%
  |                                                                            
  |=============                                                         |  19%
  |                                                                            
  |==============                                                        |  19%
  |                                                                            
  |=================                                                     |  24%
  |                                                                            
  |====================                                                  |  28%
  |                                                                            
  |====================                                                  |  29%
  |                                                                            
  |=====================                                                 |  29%
  |                                                                            
  |=======================                                               |  33%
  |                                                                            
  |========================                                              |  34%
  |                                                                            
  |=========================                                             |  35%
  |                                                                            
  |===========================                                           |  38%
  |                                                                            
  |===========================                                           |  39%
  |                                                                            
  |==============================                                        |  42%
  |                                                                            
  |==============================                                        |  43%
  |                                                                            
  |===============================                                       |  44%
  |                                                                            
  |================================                                      |  45%
  |                                                                            
  |=================================                                     |  48%
  |                                                                            
  |==================================                                    |  48%
  |                                                                            
  |===================================                                   |  50%
  |                                                                            
  |===================================                                   |  51%
  |                                                                            
  |====================================                                  |  51%
  |                                                                            
  |====================================                                  |  52%
  |                                                                            
  |=====================================                                 |  53%
  |                                                                            
  |======================================                                |  54%
  |                                                                            
  |=======================================                               |  55%
  |                                                                            
  |=======================================                               |  56%
  |                                                                            
  |================================================                      |  69%
  |                                                                            
  |=========================================================             |  82%
  |                                                                            
  |===========================================================           |  85%
  |                                                                            
  |============================================================          |  85%
  |                                                                            
  |================================================================      |  92%
  |                                                                            
  |==================================================================    |  94%
  |                                                                            
  |==================================================================    |  95%
  |                                                                            
  |===================================================================   |  95%
  |                                                                            
  |====================================================================  |  97%
  |                                                                            
  |======================================================================| 100%
## Note: 2020 decennial Census data use differential privacy, a technique that
## introduces errors into data to preserve respondent confidentiality.
## ℹ Small counts should be interpreted with caution.
## ℹ See https://www.census.gov/library/fact-sheets/2021/protecting-the-confidentiality-of-the-2020-census-redistricting-data.html for additional guidance.
## This message is displayed once per session.
df_spread <- df %>%
  spread(variable, value) %>% #turns rows of variables/values into columns
  group_by(GEOID) %>% #groups by county fips
  fill(P5_001N, P5_002N) %>%
  rename(total = P5_001N, institutional = P5_002N) %>%
  mutate(institutional_prop = institutional * 10000 / total)#creating rate per 10K
  #drop_na()

aea <-  "+proj=aea +lat_1=29.5 +lat_2=45.5 +lat_0=37.5 +lon_0=-96 +ellps=GRS80 +datum=NAD83"
tm_shape(df_spread, projection = aea) +
  tm_polygons(col = "institutional_prop", palette = "-viridis", style = "cont", 
              title = "Institutionalized \nPopulation per 10K", border.col = "white", lwd = 0)

Example 3. Advanced Data Collection & Mapping

Let’s make it a bit more complicated: * Smaller geometries, like census tract, can only be accessed one state at a time. With 50 states, this creates a lot more work. * When considering race and ethnicity (often most accessible as Hispanic/Latino/a or not Hispanic/Latino/a), we should consider races excluding Hispanic/Latino/a, as well as Hispanic/Latino/a (e.g., non-Hispanic/Latino/a Whites). To simplify this work, we can create a for loop, iterating through each of the states listed in a vector. The data will be processed and then written to a shapefile within this loop. At the end, we read in all shapefile from this folder, bind them together, and save them to a new shapefile.

ST <- c("AL", "AK", "AZ", "AR", "CA", "CO", "CT", "DE", "DC", 
        "FL", "GA", "HI", "ID", "IL", "IN", "IA", "KS", "KY",
        "LA", "ME", "MD", "MA", "MI", "MN", "MS", "MO", "MT", 
        "NE", "NV", "NH", "NJ", "NM", "NY", "NC", "ND", "OH", 
        "OK", "OR", "PA", "RI", "SC", "SD", "TN", "TX", "UT", 
        "VT", "VA", "WA", "WV", "WI", "WY")

state <- function(ST) {
  for (i in ST) {
    z_st <- get_acs(geography = "tract",
                    variables = c('B01003_001', 'B03002_003', 'B03002_004', 'B03002_005',
                                  'B03002_006', 'B03002_007', 'B03002_008', 'B03002_009',
                                  'B03002_012'),
                    state = i,
                    geometry = TRUE,
                    year = 2020)
    z_st <- z_st %>%
      spread(variable, estimate) %>%
      group_by(GEOID) %>%
      fill(B01003_001, B03002_003, B03002_004,
           B03002_005, B03002_006, B03002_007,
           B03002_008, B03002_009, B03002_012) %>%
      rename(total = B01003_001, white = B03002_003, #all of these race variables exclude hispanic/latino/a
             black = B03002_004, aian = B03002_005,
             asian = B03002_006, nhpi = B03002_007,
             other = B03002_008, two_more = B03002_009,
             hispanic = B03002_012) %>%
      drop_na()
    st_write(z_st, paste0("/Users/brenna/Documents/School/tidycensus/tract_", i, ".shp"))
  }
}

state(ST) #run
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   1%
  |                                                                            
  |=======                                                               |  11%
  |                                                                            
  |===========                                                           |  15%
  |                                                                            
  |===========                                                           |  16%
  |                                                                            
  |=============                                                         |  19%
  |                                                                            
  |===============                                                       |  22%
  |                                                                            
  |================                                                      |  23%
  |                                                                            
  |==================                                                    |  26%
  |                                                                            
  |===================                                                   |  28%
  |                                                                            
  |=====================                                                 |  30%
  |                                                                            
  |=======================                                               |  33%
  |                                                                            
  |==========================                                            |  37%
  |                                                                            
  |=============================                                         |  42%
  |                                                                            
  |===============================                                       |  44%
  |                                                                            
  |=================================                                     |  47%
  |                                                                            
  |==================================                                    |  48%
  |                                                                            
  |====================================                                  |  51%
  |                                                                            
  |=====================================                                 |  53%
  |                                                                            
  |========================================                              |  57%
  |                                                                            
  |==========================================                            |  60%
  |                                                                            
  |============================================                          |  63%
  |                                                                            
  |==============================================                        |  66%
  |                                                                            
  |===============================================                       |  67%
  |                                                                            
  |================================================                      |  69%
  |                                                                            
  |=================================================                     |  69%
  |                                                                            
  |=====================================================                 |  75%
  |                                                                            
  |=======================================================               |  79%
  |                                                                            
  |========================================================              |  80%
  |                                                                            
  |=========================================================             |  82%
  |                                                                            
  |===============================================================       |  90%
  |                                                                            
  |=================================================================     |  93%
  |                                                                            
  |===================================================================   |  96%
  |                                                                            
  |===================================================================== |  98%
  |                                                                            
  |===================================================================== |  99%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_AL' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_AL.shp' using driver `ESRI Shapefile'
## Writing 1437 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   1%
  |                                                                            
  |==                                                                    |   3%
  |                                                                            
  |===                                                                   |   4%
  |                                                                            
  |=================                                                     |  25%
  |                                                                            
  |====================                                                  |  28%
  |                                                                            
  |====================                                                  |  29%
  |                                                                            
  |======================                                                |  32%
  |                                                                            
  |=========================                                             |  36%
  |                                                                            
  |============================                                          |  41%
  |                                                                            
  |=============================                                         |  42%
  |                                                                            
  |=====================================                                 |  53%
  |                                                                            
  |==============================================                        |  66%
  |                                                                            
  |=================================================                     |  70%
  |                                                                            
  |===================================================                   |  72%
  |                                                                            
  |=====================================================                 |  76%
  |                                                                            
  |=======================================================               |  79%
  |                                                                            
  |=========================================================             |  81%
  |                                                                            
  |==========================================================            |  83%
  |                                                                            
  |============================================================          |  86%
  |                                                                            
  |================================================================      |  92%
  |                                                                            
  |=================================================================     |  93%
  |                                                                            
  |===================================================================== |  98%
  |                                                                            
  |===================================================================== |  99%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_AK' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_AK.shp' using driver `ESRI Shapefile'
## Writing 177 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   1%
  |                                                                            
  |====                                                                  |   5%
  |                                                                            
  |==========                                                            |  15%
  |                                                                            
  |====================                                                  |  29%
  |                                                                            
  |=======================================                               |  55%
  |                                                                            
  |========================================                              |  57%
  |                                                                            
  |==========================================                            |  59%
  |                                                                            
  |=============================================                         |  65%
  |                                                                            
  |================================================                      |  69%
  |                                                                            
  |===============================================================       |  89%
  |                                                                            
  |==================================================================    |  94%
  |                                                                            
  |====================================================================  |  97%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_AZ' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_AZ.shp' using driver `ESRI Shapefile'
## Writing 1765 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   1%
  |                                                                            
  |====                                                                  |   6%
  |                                                                            
  |======                                                                |   8%
  |                                                                            
  |==============                                                        |  20%
  |                                                                            
  |==================                                                    |  25%
  |                                                                            
  |=========================================                             |  59%
  |                                                                            
  |=============================================                         |  65%
  |                                                                            
  |=================================================                     |  70%
  |                                                                            
  |===================================================                   |  73%
  |                                                                            
  |===========================================================           |  84%
  |                                                                            
  |==============================================================        |  88%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_AR' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_AR.shp' using driver `ESRI Shapefile'
## Writing 823 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |===                                                                   |   4%
  |                                                                            
  |=======                                                               |  10%
  |                                                                            
  |========                                                              |  11%
  |                                                                            
  |==========                                                            |  15%
  |                                                                            
  |===========                                                           |  16%
  |                                                                            
  |=============                                                         |  18%
  |                                                                            
  |================                                                      |  22%
  |                                                                            
  |=================                                                     |  24%
  |                                                                            
  |=================                                                     |  25%
  |                                                                            
  |==================                                                    |  26%
  |                                                                            
  |=======================                                               |  33%
  |                                                                            
  |=======================                                               |  34%
  |                                                                            
  |=========================                                             |  35%
  |                                                                            
  |==========================                                            |  38%
  |                                                                            
  |===========================                                           |  39%
  |                                                                            
  |============================                                          |  40%
  |                                                                            
  |=============================                                         |  41%
  |                                                                            
  |==============================                                        |  43%
  |                                                                            
  |===============================================                       |  67%
  |                                                                            
  |===============================================                       |  68%
  |                                                                            
  |==================================================                    |  71%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_CA' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_CA.shp' using driver `ESRI Shapefile'
## Writing 9129 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   1%
  |                                                                            
  |====                                                                  |   6%
  |                                                                            
  |======                                                                |   8%
  |                                                                            
  |=============                                                         |  18%
  |                                                                            
  |=================                                                     |  25%
  |                                                                            
  |===================                                                   |  28%
  |                                                                            
  |=========================                                             |  36%
  |                                                                            
  |=============================                                         |  41%
  |                                                                            
  |=================================                                     |  47%
  |                                                                            
  |=============================================                         |  64%
  |                                                                            
  |===================================================                   |  73%
  |                                                                            
  |==========================================================            |  83%
  |                                                                            
  |===============================================================       |  90%
  |                                                                            
  |=================================================================     |  93%
  |                                                                            
  |===================================================================== |  98%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_CO' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_CO.shp' using driver `ESRI Shapefile'
## Writing 1447 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=============================                                         |  42%
  |                                                                            
  |================================                                      |  46%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_CT' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_CT.shp' using driver `ESRI Shapefile'
## Writing 883 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=========================                                             |  35%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_DE' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_DE.shp' using driver `ESRI Shapefile'
## Writing 262 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_DC' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_DC.shp' using driver `ESRI Shapefile'
## Writing 206 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   1%
  |                                                                            
  |=====                                                                 |   8%
  |                                                                            
  |=======                                                               |  10%
  |                                                                            
  |=========                                                             |  13%
  |                                                                            
  |================                                                      |  23%
  |                                                                            
  |=================                                                     |  25%
  |                                                                            
  |=======================                                               |  32%
  |                                                                            
  |===========================                                           |  38%
  |                                                                            
  |============================                                          |  40%
  |                                                                            
  |=================================                                     |  47%
  |                                                                            
  |==================================                                    |  48%
  |                                                                            
  |===================================                                   |  50%
  |                                                                            
  |=====================================                                 |  53%
  |                                                                            
  |=======================================                               |  55%
  |                                                                            
  |========================================                              |  57%
  |                                                                            
  |===========================================                           |  61%
  |                                                                            
  |=====================================================                 |  75%
  |                                                                            
  |=======================================================               |  78%
  |                                                                            
  |=======================================================               |  79%
  |                                                                            
  |============================================================          |  86%
  |                                                                            
  |==================================================================    |  94%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_FL' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_FL.shp' using driver `ESRI Shapefile'
## Writing 5160 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |                                                                      |   1%
  |                                                                            
  |==                                                                    |   3%
  |                                                                            
  |==============                                                        |  20%
  |                                                                            
  |=================                                                     |  24%
  |                                                                            
  |===================                                                   |  28%
  |                                                                            
  |=======================                                               |  33%
  |                                                                            
  |===========================                                           |  38%
  |                                                                            
  |============================                                          |  40%
  |                                                                            
  |==============================                                        |  43%
  |                                                                            
  |================================                                      |  46%
  |                                                                            
  |==================================                                    |  48%
  |                                                                            
  |=======================================                               |  56%
  |                                                                            
  |=========================================                             |  58%
  |                                                                            
  |=============================================                         |  65%
  |                                                                            
  |===========================================================           |  84%
  |                                                                            
  |============================================================          |  86%
  |                                                                            
  |=============================================================         |  87%
  |                                                                            
  |==============================================================        |  88%
  |                                                                            
  |==============================================================        |  89%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_GA' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_GA.shp' using driver `ESRI Shapefile'
## Writing 2796 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |==================                                                    |  25%
  |                                                                            
  |===================================                                   |  51%
  |                                                                            
  |=================================================                     |  70%
  |                                                                            
  |===================================================================   |  95%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_HI' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_HI.shp' using driver `ESRI Shapefile'
## Writing 461 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |==                                                                    |   2%
  |                                                                            
  |=======                                                               |  10%
  |                                                                            
  |=============                                                         |  19%
  |                                                                            
  |==================                                                    |  26%
  |                                                                            
  |=========================                                             |  36%
  |                                                                            
  |================================                                      |  45%
  |                                                                            
  |======================================                                |  54%
  |                                                                            
  |=============================================                         |  64%
  |                                                                            
  |==================================================                    |  71%
  |                                                                            
  |=========================================================             |  81%
  |                                                                            
  |===============================================================       |  90%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_ID' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_ID.shp' using driver `ESRI Shapefile'
## Writing 456 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   2%
  |                                                                            
  |======                                                                |   9%
  |                                                                            
  |=======                                                               |  11%
  |                                                                            
  |========                                                              |  12%
  |                                                                            
  |===============                                                       |  21%
  |                                                                            
  |======================                                                |  31%
  |                                                                            
  |================================                                      |  46%
  |                                                                            
  |=====================================                                 |  52%
  |                                                                            
  |=======================================                               |  55%
  |                                                                            
  |==========================================                            |  60%
  |                                                                            
  |=============================================                         |  64%
  |                                                                            
  |=================================================                     |  70%
  |                                                                            
  |====================================================                  |  74%
  |                                                                            
  |=======================================================               |  79%
  |                                                                            
  |============================================================          |  86%
  |                                                                            
  |===================================================================   |  95%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_IL' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_IL.shp' using driver `ESRI Shapefile'
## Writing 3265 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |====                                                                  |   5%
  |                                                                            
  |========                                                              |  12%
  |                                                                            
  |======================                                                |  31%
  |                                                                            
  |===================================                                   |  50%
  |                                                                            
  |=======================================                               |  55%
  |                                                                            
  |===============================================================       |  90%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_IN' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_IN.shp' using driver `ESRI Shapefile'
## Writing 1696 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |===========                                                           |  15%
  |                                                                            
  |==================                                                    |  25%
  |                                                                            
  |==========================================                            |  61%
  |                                                                            
  |=====================================================                 |  76%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_IA' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_IA.shp' using driver `ESRI Shapefile'
## Writing 896 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=======                                                               |  10%
  |                                                                            
  |=================                                                     |  24%
  |                                                                            
  |======================                                                |  31%
  |                                                                            
  |=====================================                                 |  53%
  |                                                                            
  |==================================================================    |  94%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_KS' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_KS.shp' using driver `ESRI Shapefile'
## Writing 829 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |===                                                                   |   5%
  |                                                                            
  |=====                                                                 |   7%
  |                                                                            
  |========                                                              |  11%
  |                                                                            
  |============                                                          |  17%
  |                                                                            
  |==============                                                        |  20%
  |                                                                            
  |====================================                                  |  52%
  |                                                                            
  |======================================                                |  55%
  |                                                                            
  |=======================================                               |  56%
  |                                                                            
  |==========================================                            |  61%
  |                                                                            
  |================================================                      |  69%
  |                                                                            
  |===================================================                   |  73%
  |                                                                            
  |=======================================================               |  79%
  |                                                                            
  |==========================================================            |  83%
  |                                                                            
  |===========================================================           |  84%
  |                                                                            
  |=============================================================         |  87%
  |                                                                            
  |===============================================================       |  90%
  |                                                                            
  |===============================================================       |  91%
  |                                                                            
  |===================================================================== |  98%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_KY' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_KY.shp' using driver `ESRI Shapefile'
## Writing 1306 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |===                                                                   |   5%
  |                                                                            
  |======                                                                |   9%
  |                                                                            
  |===========                                                           |  16%
  |                                                                            
  |=============                                                         |  19%
  |                                                                            
  |==============                                                        |  21%
  |                                                                            
  |=================                                                     |  24%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_LA' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_LA.shp' using driver `ESRI Shapefile'
## Writing 1388 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |==========                                                            |  14%
  |                                                                            
  |===================                                                   |  28%
  |                                                                            
  |===================================                                   |  51%
  |                                                                            
  |==========================================                            |  60%
  |                                                                            
  |==========================================================            |  83%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_ME' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_ME.shp' using driver `ESRI Shapefile'
## Writing 407 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |====                                                                  |   6%
  |                                                                            
  |=======                                                               |   9%
  |                                                                            
  |=========                                                             |  13%
  |                                                                            
  |=============                                                         |  19%
  |                                                                            
  |====================                                                  |  29%
  |                                                                            
  |============================                                          |  39%
  |                                                                            
  |=============================                                         |  41%
  |                                                                            
  |===================================                                   |  51%
  |                                                                            
  |===========================================                           |  62%
  |                                                                            
  |===============================================                       |  68%
  |                                                                            
  |=======================================================               |  79%
  |                                                                            
  |=========================================================             |  81%
  |                                                                            
  |==================================================================    |  94%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_MD' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MD.shp' using driver `ESRI Shapefile'
## Writing 1475 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |==                                                                    |   2%
  |                                                                            
  |=======                                                               |   9%
  |                                                                            
  |===========                                                           |  16%
  |                                                                            
  |=====================================                                 |  53%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_MA' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MA.shp' using driver `ESRI Shapefile'
## Writing 1620 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |===                                                                   |   5%
  |                                                                            
  |======                                                                |   8%
  |                                                                            
  |==========                                                            |  14%
  |                                                                            
  |=============                                                         |  18%
  |                                                                            
  |===============                                                       |  22%
  |                                                                            
  |==================                                                    |  26%
  |                                                                            
  |===================                                                   |  28%
  |                                                                            
  |=====================================                                 |  52%
  |                                                                            
  |============================================                          |  63%
  |                                                                            
  |===============================================                       |  68%
  |                                                                            
  |==================================================                    |  71%
  |                                                                            
  |=====================================================                 |  75%
  |                                                                            
  |===============================================================       |  90%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_MI' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MI.shp' using driver `ESRI Shapefile'
## Writing 3017 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   2%
  |                                                                            
  |===                                                                   |   5%
  |                                                                            
  |====                                                                  |   6%
  |                                                                            
  |=======                                                               |  11%
  |                                                                            
  |================================                                      |  45%
  |                                                                            
  |==============================================================        |  89%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_MN' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MN.shp' using driver `ESRI Shapefile'
## Writing 1505 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |==============                                                        |  19%
  |                                                                            
  |=========================                                             |  36%
  |                                                                            
  |======================================                                |  54%
  |                                                                            
  |=========================================                             |  59%
  |                                                                            
  |===========================================                           |  62%
  |                                                                            
  |===============================================                       |  67%
  |                                                                            
  |====================================================                  |  75%
  |                                                                            
  |=========================================================             |  81%
  |                                                                            
  |==============================================================        |  88%
  |                                                                            
  |====================================================================  |  98%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_MS' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MS.shp' using driver `ESRI Shapefile'
## Writing 878 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |==                                                                    |   3%
  |                                                                            
  |=======                                                               |  10%
  |                                                                            
  |=========                                                             |  13%
  |                                                                            
  |===========                                                           |  16%
  |                                                                            
  |==============                                                        |  21%
  |                                                                            
  |=================                                                     |  24%
  |                                                                            
  |==================                                                    |  25%
  |                                                                            
  |=====================                                                 |  29%
  |                                                                            
  |=======================                                               |  33%
  |                                                                            
  |========================                                              |  34%
  |                                                                            
  |=============================                                         |  42%
  |                                                                            
  |===============================                                       |  44%
  |                                                                            
  |======================================                                |  54%
  |                                                                            
  |==========================================                            |  60%
  |                                                                            
  |============================================                          |  62%
  |                                                                            
  |===============================================                       |  67%
  |                                                                            
  |=================================================                     |  70%
  |                                                                            
  |====================================================                  |  74%
  |                                                                            
  |======================================================                |  78%
  |                                                                            
  |=========================================================             |  82%
  |                                                                            
  |===================================================================   |  96%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_MO' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MO.shp' using driver `ESRI Shapefile'
## Writing 1654 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   2%
  |                                                                            
  |=====                                                                 |   7%
  |                                                                            
  |===========                                                           |  16%
  |                                                                            
  |==============                                                        |  20%
  |                                                                            
  |========================================                              |  57%
  |                                                                            
  |=====================================================                 |  75%
  |                                                                            
  |==========================================================            |  82%
  |                                                                            
  |==============================================================        |  88%
  |                                                                            
  |===================================================================   |  95%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_MT' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MT.shp' using driver `ESRI Shapefile'
## Writing 319 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |===                                                                   |   4%
  |                                                                            
  |============                                                          |  17%
  |                                                                            
  |=====================                                                 |  30%
  |                                                                            
  |===========================                                           |  39%
  |                                                                            
  |=================================                                     |  47%
  |                                                                            
  |=======================================                               |  56%
  |                                                                            
  |=============================================                         |  65%
  |                                                                            
  |=========================================================             |  82%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_NE' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NE.shp' using driver `ESRI Shapefile'
## Writing 553 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |==============================================                        |  66%
  |                                                                            
  |===========================================================           |  84%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_NV' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NV.shp' using driver `ESRI Shapefile'
## Writing 779 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |======                                                                |   8%
  |                                                                            
  |=======================                                               |  33%
  |                                                                            
  |=========================================                             |  58%
  |                                                                            
  |================================================================      |  92%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_NH' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NH.shp' using driver `ESRI Shapefile'
## Writing 350 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=====                                                                 |   7%
  |                                                                            
  |==========                                                            |  15%
  |                                                                            
  |==============                                                        |  20%
  |                                                                            
  |======================================                                |  54%
  |                                                                            
  |===========================================                           |  61%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_NJ' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NJ.shp' using driver `ESRI Shapefile'
## Writing 2181 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=======                                                               |   9%
  |                                                                            
  |===========                                                           |  16%
  |                                                                            
  |====================                                                  |  28%
  |                                                                            
  |=========================                                             |  35%
  |                                                                            
  |==============================                                        |  42%
  |                                                                            
  |===============================                                       |  45%
  |                                                                            
  |===========================================                           |  62%
  |                                                                            
  |================================================                      |  69%
  |                                                                            
  |====================================================================  |  97%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_NM' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NM.shp' using driver `ESRI Shapefile'
## Writing 612 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |======                                                                |   8%
  |                                                                            
  |========                                                              |  12%
  |                                                                            
  |================                                                      |  22%
  |                                                                            
  |================                                                      |  23%
  |                                                                            
  |=================                                                     |  24%
  |                                                                            
  |======================                                                |  31%
  |                                                                            
  |=======================                                               |  33%
  |                                                                            
  |===========================                                           |  39%
  |                                                                            
  |=============================                                         |  41%
  |                                                                            
  |=======================================                               |  56%
  |                                                                            
  |==========================================                            |  60%
  |                                                                            
  |============================================                          |  62%
  |                                                                            
  |===============================================                       |  67%
  |                                                                            
  |================================================                      |  69%
  |                                                                            
  |==================================================                    |  71%
  |                                                                            
  |===================================================                   |  73%
  |                                                                            
  |==========================================================            |  82%
  |                                                                            
  |=================================================================     |  93%
  |                                                                            
  |====================================================================  |  97%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_NY' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NY.shp' using driver `ESRI Shapefile'
## Writing 5411 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |                                                                      |   1%
  |                                                                            
  |========                                                              |  12%
  |                                                                            
  |===========                                                           |  15%
  |                                                                            
  |=============                                                         |  19%
  |                                                                            
  |================                                                      |  23%
  |                                                                            
  |=================                                                     |  24%
  |                                                                            
  |===================                                                   |  27%
  |                                                                            
  |====================                                                  |  29%
  |                                                                            
  |=========================                                             |  36%
  |                                                                            
  |============================                                          |  40%
  |                                                                            
  |=============================                                         |  42%
  |                                                                            
  |==================================                                    |  48%
  |                                                                            
  |===================================                                   |  50%
  |                                                                            
  |=======================================                               |  56%
  |                                                                            
  |=========================================                             |  58%
  |                                                                            
  |===========================================                           |  61%
  |                                                                            
  |============================================                          |  63%
  |                                                                            
  |==============================================                        |  65%
  |                                                                            
  |===============================================                       |  67%
  |                                                                            
  |==================================================                    |  71%
  |                                                                            
  |==================================================================    |  95%
  |                                                                            
  |===================================================================   |  95%
  |                                                                            
  |===================================================================   |  96%
  |                                                                            
  |====================================================================  |  97%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_NC' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NC.shp' using driver `ESRI Shapefile'
## Writing 2672 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |==========================                                            |  36%
  |                                                                            
  |===========================================                           |  61%
  |                                                                            
  |=======================================================               |  79%
  |                                                                            
  |====================================================================  |  97%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_ND' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_ND.shp' using driver `ESRI Shapefile'
## Writing 228 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |===                                                                   |   4%
  |                                                                            
  |=====                                                                 |   7%
  |                                                                            
  |===========                                                           |  16%
  |                                                                            
  |============================                                          |  40%
  |                                                                            
  |==================================                                    |  49%
  |                                                                            
  |=========================================                             |  59%
  |                                                                            
  |==========================================                            |  60%
  |                                                                            
  |==========================================                            |  61%
  |                                                                            
  |=============================================                         |  65%
  |                                                                            
  |==============================================                        |  66%
  |                                                                            
  |===============================================                       |  67%
  |                                                                            
  |======================================================                |  77%
  |                                                                            
  |=============================================================         |  87%
  |                                                                            
  |==============================================================        |  88%
  |                                                                            
  |===============================================================       |  89%
  |                                                                            
  |======================================================================|  99%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_OH' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_OH.shp' using driver `ESRI Shapefile'
## Writing 3168 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=============                                                         |  19%
  |                                                                            
  |===================                                                   |  27%
  |                                                                            
  |========================                                              |  34%
  |                                                                            
  |======================================                                |  55%
  |                                                                            
  |=============================================                         |  65%
  |                                                                            
  |=================================================                     |  70%
  |                                                                            
  |===================================================                   |  74%
  |                                                                            
  |=======================================================               |  79%
  |                                                                            
  |============================================================          |  86%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_OK' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_OK.shp' using driver `ESRI Shapefile'
## Writing 1205 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |====                                                                  |   6%
  |                                                                            
  |============                                                          |  17%
  |                                                                            
  |===================                                                   |  28%
  |                                                                            
  |=====================                                                 |  30%
  |                                                                            
  |=================================                                     |  47%
  |                                                                            
  |======================================                                |  54%
  |                                                                            
  |=========================================                             |  59%
  |                                                                            
  |============================================                          |  63%
  |                                                                            
  |================================================                      |  69%
  |                                                                            
  |=====================================================                 |  76%
  |                                                                            
  |=============================================================         |  88%
  |                                                                            
  |==============================================================        |  89%
  |                                                                            
  |====================================================================  |  97%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_OR' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_OR.shp' using driver `ESRI Shapefile'
## Writing 1001 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   2%
  |                                                                            
  |==                                                                    |   3%
  |                                                                            
  |============                                                          |  17%
  |                                                                            
  |=============                                                         |  18%
  |                                                                            
  |===============                                                       |  21%
  |                                                                            
  |================                                                      |  23%
  |                                                                            
  |==================                                                    |  26%
  |                                                                            
  |====================                                                  |  29%
  |                                                                            
  |===========================                                           |  39%
  |                                                                            
  |==============================                                        |  44%
  |                                                                            
  |================================                                      |  46%
  |                                                                            
  |=================================                                     |  48%
  |                                                                            
  |============================================                          |  64%
  |                                                                            
  |=============================================                         |  65%
  |                                                                            
  |===============================================                       |  67%
  |                                                                            
  |=====================================================                 |  76%
  |                                                                            
  |=============================================================         |  87%
  |                                                                            
  |====================================================================  |  97%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_PA' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_PA.shp' using driver `ESRI Shapefile'
## Writing 3446 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=========================================                             |  59%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_RI' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_RI.shp' using driver `ESRI Shapefile'
## Writing 250 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   1%
  |                                                                            
  |===                                                                   |   5%
  |                                                                            
  |=========                                                             |  12%
  |                                                                            
  |=============                                                         |  18%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_SC' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_SC.shp' using driver `ESRI Shapefile'
## Writing 1323 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |===========================                                           |  38%
  |                                                                            
  |==================================================                    |  71%
  |                                                                            
  |=====================================================                 |  76%
  |                                                                            
  |=============================================================         |  87%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_SD' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_SD.shp' using driver `ESRI Shapefile'
## Writing 242 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |===                                                                   |   4%
  |                                                                            
  |============                                                          |  18%
  |                                                                            
  |=====================                                                 |  31%
  |                                                                            
  |========================                                              |  34%
  |                                                                            
  |==================================                                    |  49%
  |                                                                            
  |====================================                                  |  52%
  |                                                                            
  |=========================================                             |  59%
  |                                                                            
  |==============================================                        |  66%
  |                                                                            
  |=================================================                     |  70%
  |                                                                            
  |===================================================                   |  73%
  |                                                                            
  |=========================================================             |  82%
  |                                                                            
  |==========================================================            |  83%
  |                                                                            
  |===========================================================           |  84%
  |                                                                            
  |=============================================================         |  88%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_TN' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_TN.shp' using driver `ESRI Shapefile'
## Writing 1701 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   2%
  |                                                                            
  |==                                                                    |   3%
  |                                                                            
  |===                                                                   |   4%
  |                                                                            
  |===                                                                   |   5%
  |                                                                            
  |====                                                                  |   6%
  |                                                                            
  |=====                                                                 |   7%
  |                                                                            
  |=====                                                                 |   8%
  |                                                                            
  |======                                                                |   9%
  |                                                                            
  |=======                                                               |  10%
  |                                                                            
  |========                                                              |  11%
  |                                                                            
  |=========                                                             |  12%
  |                                                                            
  |=========                                                             |  13%
  |                                                                            
  |==========                                                            |  14%
  |                                                                            
  |===========                                                           |  15%
  |                                                                            
  |============                                                          |  17%
  |                                                                            
  |======================                                                |  31%
  |                                                                            
  |========================                                              |  34%
  |                                                                            
  |=========================                                             |  35%
  |                                                                            
  |=========================                                             |  36%
  |                                                                            
  |===============================                                       |  44%
  |                                                                            
  |================================                                      |  46%
  |                                                                            
  |=================================                                     |  47%
  |                                                                            
  |==================================                                    |  49%
  |                                                                            
  |===================================                                   |  51%
  |                                                                            
  |===========================================                           |  61%
  |                                                                            
  |===============================================                       |  66%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_TX' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_TX.shp' using driver `ESRI Shapefile'
## Writing 6896 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=====                                                                 |   7%
  |                                                                            
  |==============                                                        |  19%
  |                                                                            
  |================================                                      |  46%
  |                                                                            
  |==================================                                    |  48%
  |                                                                            
  |========================================                              |  58%
  |                                                                            
  |=============================================                         |  65%
  |                                                                            
  |====================================================                  |  75%
  |                                                                            
  |========================================================              |  79%
  |                                                                            
  |===========================================================           |  84%
  |                                                                            
  |=============================================================         |  86%
  |                                                                            
  |===================================================================== |  99%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_UT' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_UT.shp' using driver `ESRI Shapefile'
## Writing 716 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_VT' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_VT.shp' using driver `ESRI Shapefile'
## Writing 193 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=                                                                     |   2%
  |                                                                            
  |==                                                                    |   4%
  |                                                                            
  |====                                                                  |   5%
  |                                                                            
  |====================                                                  |  29%
  |                                                                            
  |===============================                                       |  44%
  |                                                                            
  |===================================                                   |  51%
  |                                                                            
  |========================================                              |  57%
  |                                                                            
  |=======================================================               |  79%
  |                                                                            
  |====================================================================  |  98%
  |                                                                            
  |===================================================================== |  99%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_VA' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_VA.shp' using driver `ESRI Shapefile'
## Writing 2198 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |==                                                                    |   2%
  |                                                                            
  |===                                                                   |   4%
  |                                                                            
  |===================                                                   |  27%
  |                                                                            
  |=======================                                               |  32%
  |                                                                            
  |========================                                              |  34%
  |                                                                            
  |=================================                                     |  47%
  |                                                                            
  |====================================                                  |  51%
  |                                                                            
  |=========================================                             |  58%
  |                                                                            
  |==========================================                            |  60%
  |                                                                            
  |===========================================                           |  61%
  |                                                                            
  |==============================================                        |  66%
  |                                                                            
  |================================================                      |  69%
  |                                                                            
  |=================================================                     |  70%
  |                                                                            
  |=======================================================               |  79%
  |                                                                            
  |============================================================          |  85%
  |                                                                            
  |==============================================================        |  89%
  |                                                                            
  |====================================================================  |  97%
  |                                                                            
  |====================================================================  |  98%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_WA' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_WA.shp' using driver `ESRI Shapefile'
## Writing 1784 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |=====                                                                 |   7%
  |                                                                            
  |==========                                                            |  14%
  |                                                                            
  |================                                                      |  23%
  |                                                                            
  |========================                                              |  35%
  |                                                                            
  |=============================                                         |  41%
  |                                                                            
  |====================================                                  |  52%
  |                                                                            
  |==========================================                            |  60%
  |                                                                            
  |=================================================                     |  69%
  |                                                                            
  |======================================================                |  76%
  |                                                                            
  |=========================================================             |  82%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_WV' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_WV.shp' using driver `ESRI Shapefile'
## Writing 546 features with 12 fields and geometry type Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |==================                                                    |  26%
  |                                                                            
  |==================================                                    |  49%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_WI' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_WI.shp' using driver `ESRI Shapefile'
## Writing 1542 features with 12 fields and geometry type Multi Polygon.
## Getting data from the 2016-2020 5-year ACS
## Downloading feature geometry from the Census website.  To cache shapefiles for use in future sessions, set `options(tigris_use_cache = TRUE)`.
## 
  |                                                                            
  |                                                                      |   0%
  |                                                                            
  |===                                                                   |   5%
  |                                                                            
  |=============                                                         |  19%
  |                                                                            
  |====================                                                  |  28%
  |                                                                            
  |==========================                                            |  37%
  |                                                                            
  |==========================================                            |  60%
  |                                                                            
  |====================================================================  |  98%
  |                                                                            
  |======================================================================| 100%
## Writing layer `tract_WY' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_WY.shp' using driver `ESRI Shapefile'
## Writing 159 features with 12 fields and geometry type Polygon.
st_tracts <- map(list.files("/Users/brenna/Documents/School/tidycensus/", full.names = T, pattern = ".shp"), st_read) %>%
  bind_rows() %>%
  st_write("/Users/brenna/Documents/School/tidycensus/tract_census.shp")
## Reading layer `tract_AK' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_AK.shp' using driver `ESRI Shapefile'
## Simple feature collection with 177 features and 12 fields
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -179.1489 ymin: 51.21418 xmax: 179.7785 ymax: 71.36516
## Geodetic CRS:  NAD83
## Reading layer `tract_AL' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_AL.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1437 features and 12 fields (with 1 geometry empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -88.47323 ymin: 30.22333 xmax: -84.88908 ymax: 35.00803
## Geodetic CRS:  NAD83
## Reading layer `tract_AR' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_AR.shp' using driver `ESRI Shapefile'
## Simple feature collection with 823 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -94.61792 ymin: 33.00429 xmax: -89.641 ymax: 36.4996
## Geodetic CRS:  NAD83
## Reading layer `tract_AZ' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_AZ.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1765 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -114.8165 ymin: 31.33218 xmax: -109.0452 ymax: 37.00426
## Geodetic CRS:  NAD83
## Reading layer `tract_CA' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_CA.shp' using driver `ESRI Shapefile'
## Simple feature collection with 9129 features and 12 fields (with 20 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -124.4096 ymin: 32.53444 xmax: -114.1312 ymax: 42.00948
## Geodetic CRS:  NAD83
## Reading layer `tract_CO' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_CO.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1447 features and 12 fields
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -109.0603 ymin: 36.99243 xmax: -102.0415 ymax: 41.00344
## Geodetic CRS:  NAD83
## Reading layer `tract_CT' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_CT.shp' using driver `ESRI Shapefile'
## Simple feature collection with 883 features and 12 fields (with 4 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -73.72777 ymin: 40.98014 xmax: -71.78699 ymax: 42.05059
## Geodetic CRS:  NAD83
## Reading layer `tract_DC' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_DC.shp' using driver `ESRI Shapefile'
## Simple feature collection with 206 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -77.11976 ymin: 38.79165 xmax: -76.9094 ymax: 38.99511
## Geodetic CRS:  NAD83
## Reading layer `tract_DE' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_DE.shp' using driver `ESRI Shapefile'
## Simple feature collection with 262 features and 12 fields (with 3 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -75.78866 ymin: 38.45101 xmax: -75.04894 ymax: 39.83901
## Geodetic CRS:  NAD83
## Reading layer `tract_FL' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_FL.shp' using driver `ESRI Shapefile'
## Simple feature collection with 5160 features and 12 fields (with 38 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -87.63494 ymin: 24.5231 xmax: -80.03136 ymax: 31.00089
## Geodetic CRS:  NAD83
## Reading layer `tract_GA' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_GA.shp' using driver `ESRI Shapefile'
## Simple feature collection with 2796 features and 12 fields (with 5 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -85.60516 ymin: 30.35785 xmax: -80.84038 ymax: 35.00124
## Geodetic CRS:  NAD83
## Reading layer `tract_HI' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_HI.shp' using driver `ESRI Shapefile'
## Simple feature collection with 461 features and 12 fields (with 25 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -178.3347 ymin: 18.91036 xmax: -154.8068 ymax: 28.40212
## Geodetic CRS:  NAD83
## Reading layer `tract_IA' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_IA.shp' using driver `ESRI Shapefile'
## Simple feature collection with 896 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -96.63862 ymin: 40.37566 xmax: -90.14006 ymax: 43.5012
## Geodetic CRS:  NAD83
## Reading layer `tract_ID' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_ID.shp' using driver `ESRI Shapefile'
## Simple feature collection with 456 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -117.243 ymin: 41.98821 xmax: -111.0436 ymax: 49.00091
## Geodetic CRS:  NAD83
## Reading layer `tract_IL' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_IL.shp' using driver `ESRI Shapefile'
## Simple feature collection with 3265 features and 12 fields (with 2 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -91.51308 ymin: 36.9703 xmax: -87.4952 ymax: 42.50848
## Geodetic CRS:  NAD83
## Reading layer `tract_IN' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_IN.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1696 features and 12 fields (with 3 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -88.09789 ymin: 37.77174 xmax: -84.78458 ymax: 41.76059
## Geodetic CRS:  NAD83
## Reading layer `tract_KS' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_KS.shp' using driver `ESRI Shapefile'
## Simple feature collection with 829 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -102.0517 ymin: 36.99302 xmax: -94.58841 ymax: 40.00316
## Geodetic CRS:  NAD83
## Reading layer `tract_KY' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_KY.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1306 features and 12 fields
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -89.57151 ymin: 36.49713 xmax: -81.96497 ymax: 39.14746
## Geodetic CRS:  NAD83
## Reading layer `tract_LA' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_LA.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1388 features and 12 fields (with 9 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -94.04315 ymin: 28.92861 xmax: -88.81702 ymax: 33.01946
## Geodetic CRS:  NAD83
## Reading layer `tract_MA' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MA.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1620 features and 12 fields (with 6 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -73.50814 ymin: 41.23796 xmax: -69.92839 ymax: 42.88659
## Geodetic CRS:  NAD83
## Reading layer `tract_MD' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MD.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1475 features and 12 fields (with 10 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -79.48765 ymin: 37.91172 xmax: -75.04894 ymax: 39.72304
## Geodetic CRS:  NAD83
## Reading layer `tract_ME' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_ME.shp' using driver `ESRI Shapefile'
## Simple feature collection with 407 features and 12 fields (with 6 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -71.08392 ymin: 42.97776 xmax: -66.9499 ymax: 47.45969
## Geodetic CRS:  NAD83
## Reading layer `tract_MI' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MI.shp' using driver `ESRI Shapefile'
## Simple feature collection with 3017 features and 12 fields (with 46 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -90.41814 ymin: 41.69612 xmax: -82.41347 ymax: 48.2388
## Geodetic CRS:  NAD83
## Reading layer `tract_MN' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MN.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1505 features and 12 fields (with 3 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -97.23921 ymin: 43.49937 xmax: -89.49174 ymax: 49.38436
## Geodetic CRS:  NAD83
## Reading layer `tract_MO' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MO.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1654 features and 12 fields
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -95.7747 ymin: 35.99568 xmax: -89.09884 ymax: 40.61364
## Geodetic CRS:  NAD83
## Reading layer `tract_MS' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MS.shp' using driver `ESRI Shapefile'
## Simple feature collection with 878 features and 12 fields (with 3 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -91.65501 ymin: 30.17394 xmax: -88.09789 ymax: 34.99605
## Geodetic CRS:  NAD83
## Reading layer `tract_MT' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_MT.shp' using driver `ESRI Shapefile'
## Simple feature collection with 319 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -116.0492 ymin: 44.35796 xmax: -104.0396 ymax: 49.00139
## Geodetic CRS:  NAD83
## Reading layer `tract_NC' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NC.shp' using driver `ESRI Shapefile'
## Simple feature collection with 2672 features and 12 fields (with 12 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -84.32187 ymin: 33.84232 xmax: -75.46062 ymax: 36.58812
## Geodetic CRS:  NAD83
## Reading layer `tract_ND' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_ND.shp' using driver `ESRI Shapefile'
## Simple feature collection with 228 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -104.0489 ymin: 45.93505 xmax: -96.55451 ymax: 49.00057
## Geodetic CRS:  NAD83
## Reading layer `tract_NE' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NE.shp' using driver `ESRI Shapefile'
## Simple feature collection with 553 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -104.0535 ymin: 40 xmax: -95.30829 ymax: 43.00171
## Geodetic CRS:  NAD83
## Reading layer `tract_NH' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NH.shp' using driver `ESRI Shapefile'
## Simple feature collection with 350 features and 12 fields (with 1 geometry empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -72.55725 ymin: 42.69699 xmax: -70.61062 ymax: 45.30548
## Geodetic CRS:  NAD83
## Reading layer `tract_NJ' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NJ.shp' using driver `ESRI Shapefile'
## Simple feature collection with 2181 features and 12 fields (with 6 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -75.55961 ymin: 38.92852 xmax: -73.89363 ymax: 41.35742
## Geodetic CRS:  NAD83
## Reading layer `tract_NM' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NM.shp' using driver `ESRI Shapefile'
## Simple feature collection with 612 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -109.0502 ymin: 31.3323 xmax: -103.002 ymax: 37.00023
## Geodetic CRS:  NAD83
## Reading layer `tract_NV' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NV.shp' using driver `ESRI Shapefile'
## Simple feature collection with 779 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -120.0065 ymin: 35.00186 xmax: -114.0396 ymax: 42.00221
## Geodetic CRS:  NAD83
## Reading layer `tract_NY' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_NY.shp' using driver `ESRI Shapefile'
## Simple feature collection with 5411 features and 12 fields (with 17 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -79.76215 ymin: 40.4961 xmax: -71.85621 ymax: 45.01585
## Geodetic CRS:  NAD83
## Reading layer `tract_OH' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_OH.shp' using driver `ESRI Shapefile'
## Simple feature collection with 3168 features and 12 fields (with 6 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -84.82016 ymin: 38.4032 xmax: -80.51869 ymax: 41.97716
## Geodetic CRS:  NAD83
## Reading layer `tract_OK' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_OK.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1205 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -103.0026 ymin: 33.61583 xmax: -94.43066 ymax: 37.00221
## Geodetic CRS:  NAD83
## Reading layer `tract_OR' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_OR.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1001 features and 12 fields (with 7 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -124.5662 ymin: 41.99179 xmax: -116.4635 ymax: 46.29083
## Geodetic CRS:  NAD83
## Reading layer `tract_PA' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_PA.shp' using driver `ESRI Shapefile'
## Simple feature collection with 3446 features and 12 fields (with 1 geometry empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -80.51989 ymin: 39.7198 xmax: -74.68952 ymax: 42.26986
## Geodetic CRS:  NAD83
## Reading layer `tract_RI' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_RI.shp' using driver `ESRI Shapefile'
## Simple feature collection with 250 features and 12 fields (with 3 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -71.86277 ymin: 41.14634 xmax: -71.12057 ymax: 42.0188
## Geodetic CRS:  NAD83
## Reading layer `tract_SC' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_SC.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1323 features and 12 fields (with 6 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -83.35391 ymin: 32.03759 xmax: -78.54203 ymax: 35.2154
## Geodetic CRS:  NAD83
## Reading layer `tract_SD' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_SD.shp' using driver `ESRI Shapefile'
## Simple feature collection with 242 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -104.0579 ymin: 42.47964 xmax: -96.43659 ymax: 45.94545
## Geodetic CRS:  NAD83
## Reading layer `tract_TN' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_TN.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1701 features and 12 fields
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -90.31045 ymin: 34.98297 xmax: -81.6469 ymax: 36.67812
## Geodetic CRS:  NAD83
## Reading layer `tract_TX' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_TX.shp' using driver `ESRI Shapefile'
## Simple feature collection with 6896 features and 12 fields (with 12 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -106.6456 ymin: 25.83738 xmax: -93.50829 ymax: 36.5007
## Geodetic CRS:  NAD83
## Reading layer `tract_UT' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_UT.shp' using driver `ESRI Shapefile'
## Simple feature collection with 716 features and 12 fields
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -114.053 ymin: 36.99797 xmax: -109.0411 ymax: 42.0017
## Geodetic CRS:  NAD83
## Reading layer `tract_VA' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_VA.shp' using driver `ESRI Shapefile'
## Simple feature collection with 2198 features and 12 fields (with 12 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -83.67539 ymin: 36.54074 xmax: -75.24247 ymax: 39.46601
## Geodetic CRS:  NAD83
## Reading layer `tract_VT' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_VT.shp' using driver `ESRI Shapefile'
## Simple feature collection with 193 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -73.43774 ymin: 42.72685 xmax: -71.46456 ymax: 45.01666
## Geodetic CRS:  NAD83
## Reading layer `tract_WA' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_WA.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1784 features and 12 fields (with 11 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -124.7631 ymin: 45.54354 xmax: -116.916 ymax: 49.00249
## Geodetic CRS:  NAD83
## Reading layer `tract_WI' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_WI.shp' using driver `ESRI Shapefile'
## Simple feature collection with 1542 features and 12 fields (with 14 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -92.88811 ymin: 42.49198 xmax: -86.80542 ymax: 47.08062
## Geodetic CRS:  NAD83
## Reading layer `tract_WV' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_WV.shp' using driver `ESRI Shapefile'
## Simple feature collection with 546 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -82.64474 ymin: 37.20148 xmax: -77.71952 ymax: 40.6388
## Geodetic CRS:  NAD83
## Reading layer `tract_WY' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_WY.shp' using driver `ESRI Shapefile'
## Simple feature collection with 159 features and 12 fields
## Geometry type: POLYGON
## Dimension:     XY
## Bounding box:  xmin: -111.0546 ymin: 40.99475 xmax: -104.0522 ymax: 45.00582
## Geodetic CRS:  NAD83
## Writing layer `tract_census' to data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_census.shp' using driver `ESRI Shapefile'
## Writing 84413 features with 12 fields and geometry type Unknown (any).
tracts <- st_read("/Users/brenna/Documents/School/tidycensus/tract_census.shp")
## Reading layer `tract_census' from data source 
##   `/Users/brenna/Documents/School/tidycensus/tract_census.shp' 
##   using driver `ESRI Shapefile'
## Simple feature collection with 84413 features and 12 fields (with 292 geometries empty)
## Geometry type: MULTIPOLYGON
## Dimension:     XY
## Bounding box:  xmin: -179.1489 ymin: 18.91036 xmax: 179.7785 ymax: 71.36516
## Geodetic CRS:  NAD83
#tm_shape(tracts, projection = aea) +
#  tm_polygons(col = "black", palette = "viridis", style = "cont",
#              title = "Black/African American Population", border.col = "white", lwd = 0)

Additional resources:
https://walker-data.com/tidycensus/articles/basic-usage.html
https://walker-data.com/tidycensus/reference/get_decennial.html
https://www.census.gov/content/dam/Census/library/publications/2020/acs/acs_general_handbook_2020_ch09.pdf