###All Employees: Retail Trade in Riverside-San Bernardino-Ontario, CA (MSA) (SMU06401404200000001)

indicator <-fredr_series_observations(series_id = "SMU06401404200000001",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 182.9
2019-02-01 179.8
2019-03-01 178.5
2019-04-01 178.4
2019-05-01 179.0
2019-06-01 178.2
2019-07-01 179.4
2019-08-01 179.7
2019-09-01 178.9
2019-10-01 181.3
2019-11-01 188.8
2019-12-01 191.0
2020-01-01 181.9
2020-02-01 180.0
2020-03-01 178.7
2020-04-01 149.3
2020-05-01 149.3
2020-06-01 156.4
2020-07-01 161.3
2020-08-01 163.2
# plotting data
indicator %>% ggplot() + 
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.02)+
  geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Retail Trade in Riverside-San Bernardino-Ontario, CA", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    #theme_economist()
theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

All Employees: Retail Trade: Automotive Parts, Accessories, and Tire Stores in Riverside-San Bernardino-Ontario, CA (MSA) (SMU06401404244130001)

indicator <-fredr_series_observations(series_id = "SMU06401404244130001",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 7.5
2019-02-01 7.6
2019-03-01 7.6
2019-04-01 7.5
2019-05-01 7.5
2019-06-01 7.5
2019-07-01 7.5
2019-08-01 7.6
2019-09-01 7.5
2019-10-01 7.5
2019-11-01 7.5
2019-12-01 7.5
2020-01-01 7.4
2020-02-01 7.5
2020-03-01 7.5
2020-04-01 6.3
2020-05-01 6.7
2020-06-01 6.8
2020-07-01 6.8
2020-08-01 6.9
indicator %>% ggplot() + 
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.02)+
  geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "All Employees: Automotive Parts, Accessories, and Tire Stores in Riverside-San Bernardino-Ontario, CA", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED St. Louis Federal Reserve.   \nIllustration by @JoeLongSanDiego")+
 
  theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

All Employees: Retail Trade: Health and Personal Care Stores in Riverside-San Bernardino-Ontario, CA (MSA) (SMU06401404244600001)

indicator <-fredr_series_observations(series_id = "SMU06401404340008901",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 134.8
2019-02-01 131.3
2019-03-01 130.0
2019-04-01 130.6
2019-05-01 132.1
2019-06-01 134.8
2019-07-01 138.2
2019-08-01 140.2
2019-09-01 141.5
2019-10-01 144.3
2019-11-01 148.9
2019-12-01 149.5
2020-01-01 142.9
2020-02-01 142.2
2020-03-01 141.3
2020-04-01 133.6
2020-05-01 135.5
2020-06-01 135.6
2020-07-01 135.1
2020-08-01 139.9
# plotting data
indicator %>% ggplot() + 
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.02)+
  geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Retail Trade: Health and Personal Care Stores in Riverside-San Bernardino-Ontario, CA (MSA)", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
     theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

All Employees: Retail Trade: Clothing and Clothing Accessories Stores in Riverside-San Bernardino-Ontario, CA (MSA) (SMU06401404244800001)

indicator <-fredr_series_observations(series_id = "SMU06401404244800001",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 21.7
2019-02-01 20.2
2019-03-01 20.0
2019-04-01 19.6
2019-05-01 19.6
2019-06-01 19.8
2019-07-01 20.2
2019-08-01 20.1
2019-09-01 19.4
2019-10-01 19.8
2019-11-01 22.0
2019-12-01 23.1
2020-01-01 20.5
2020-02-01 19.1
2020-03-01 18.6
2020-04-01 8.1
2020-05-01 8.1
2020-06-01 12.0
2020-07-01 15.0
2020-08-01 13.9
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "All Employees: Retail Trade: Clothing and Clothing Accessories Stores in Riverside-San Bernardino-Ontario, CA", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED St. Louis Federal Reserve.   Illustration by @JoeLongSanDiego")+
    theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

Full-Service Restaurants (SMU06401407072251101SA)

indicator <-fredr_series_observations(series_id = "SMU06401407072251101SA",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 51.53
2019-02-01 51.50
2019-03-01 51.56
2019-04-01 51.61
2019-05-01 51.56
2019-06-01 51.57
2019-07-01 51.55
2019-08-01 51.43
2019-09-01 51.51
2019-10-01 50.89
2019-11-01 51.03
2019-12-01 50.52
2020-01-01 49.85
2020-02-01 50.42
2020-03-01 44.68
2020-04-01 11.23
2020-05-01 14.68
2020-06-01 24.47
2020-07-01 25.02
2020-08-01 25.58
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Full-Service Restaurants in Riverside-San Bernardino-Ontario, CA  ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)} _ Seasionally Adjusted"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
     theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

Retail Trade: Automotive Parts, Accessories, and Tire Stores (SMU06401404244130001)

indicator <-fredr_series_observations(series_id = "SMU06401404244130001",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 7.5
2019-02-01 7.6
2019-03-01 7.6
2019-04-01 7.5
2019-05-01 7.5
2019-06-01 7.5
2019-07-01 7.5
2019-08-01 7.6
2019-09-01 7.5
2019-10-01 7.5
2019-11-01 7.5
2019-12-01 7.5
2020-01-01 7.4
2020-02-01 7.5
2020-03-01 7.5
2020-04-01 6.3
2020-05-01 6.7
2020-06-01 6.8
2020-07-01 6.8
2020-08-01 6.9
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Retail Trade: Automotive Parts, Accessories, and Tire Stores  ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)} "),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
   theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

Manufacturing: Durable Goods (SMU06401403100000001)

indicator <-fredr_series_observations(series_id = "SMU06401403100000001",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 64.7
2019-02-01 65.1
2019-03-01 65.1
2019-04-01 65.3
2019-05-01 65.1
2019-06-01 65.4
2019-07-01 65.2
2019-08-01 65.0
2019-09-01 64.6
2019-10-01 64.1
2019-11-01 64.8
2019-12-01 64.8
2020-01-01 63.2
2020-02-01 63.9
2020-03-01 64.1
2020-04-01 60.5
2020-05-01 58.7
2020-06-01 59.3
2020-07-01 59.7
2020-08-01 58.2
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Manufacturing: Durable Goods in Riverside-San Bernardino-Ontario, CA ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
   theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

Warehousing and Storage (SMU06401404349300001SA)

indicator <-fredr_series_observations(series_id = "SMU06401404349300001SA",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 74.34
2019-02-01 72.35
2019-03-01 72.40
2019-04-01 73.88
2019-05-01 74.39
2019-06-01 76.54
2019-07-01 78.01
2019-08-01 77.93
2019-09-01 78.13
2019-10-01 78.91
2019-11-01 78.71
2019-12-01 79.63
2020-01-01 80.36
2020-02-01 82.13
2020-03-01 83.25
2020-04-01 79.66
2020-05-01 80.44
2020-06-01 79.11
2020-07-01 79.31
2020-08-01 80.56
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Warehousing and Storage in Riverside-San Bernardino-Ontario, CA ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
 theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

Federal Government (SMU06401409091000001)

indicator <-fredr_series_observations(series_id = "SMU06401409091000001",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 20.8
2019-02-01 20.9
2019-03-01 20.8
2019-04-01 20.9
2019-05-01 20.9
2019-06-01 21.1
2019-07-01 21.2
2019-08-01 21.3
2019-09-01 21.3
2019-10-01 21.3
2019-11-01 21.4
2019-12-01 21.4
2020-01-01 21.1
2020-02-01 21.2
2020-03-01 21.4
2020-04-01 21.9
2020-05-01 21.9
2020-06-01 22.1
2020-07-01 22.0
2020-08-01 25.4
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Federal Government in Riverside-San Bernardino-Ontario, CA ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
  theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

General Freight Trucking (SMU06401404348410001)

indicator <-fredr_series_observations(series_id = "SMU06401404348410001",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 21.4
2019-02-01 21.6
2019-03-01 21.5
2019-04-01 21.6
2019-05-01 21.6
2019-06-01 21.7
2019-07-01 21.9
2019-08-01 21.9
2019-09-01 21.9
2019-10-01 21.8
2019-11-01 21.5
2019-12-01 21.4
2020-01-01 21.3
2020-02-01 21.4
2020-03-01 21.4
2020-04-01 20.1
2020-05-01 20.1
2020-06-01 20.2
2020-07-01 20.3
2020-08-01 20.7
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: General Freight Trucking in Riverside-San Bernardino-Ontario, CA ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
    theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

Employment: Nursing and Residential Care Facilities

indicator <-fredr_series_observations(series_id = "SMU06401406562300001",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 26.9
2019-02-01 27.3
2019-03-01 27.2
2019-04-01 26.8
2019-05-01 27.0
2019-06-01 27.2
2019-07-01 27.6
2019-08-01 27.8
2019-09-01 27.8
2019-10-01 28.0
2019-11-01 28.1
2019-12-01 28.1
2020-01-01 28.0
2020-02-01 28.1
2020-03-01 28.1
2020-04-01 27.1
2020-05-01 27.3
2020-06-01 27.3
2020-07-01 27.0
2020-08-01 26.6
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Nursing and Residential Care Facilities in Riverside-San Bernardino-Ontario, CA ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
   theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

All Employees: Health Care: Offices of Physicians in Riverside-San Bernardino-Ontario, CA (MSA)

indicator <-fredr_series_observations(series_id = "SMU06401406562110001SA",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 22.71
2019-02-01 22.87
2019-03-01 22.88
2019-04-01 22.99
2019-05-01 23.17
2019-06-01 23.24
2019-07-01 23.40
2019-08-01 23.48
2019-09-01 23.33
2019-10-01 23.23
2019-11-01 23.65
2019-12-01 23.73
2020-01-01 23.81
2020-02-01 23.87
2020-03-01 23.79
2020-04-01 22.09
2020-05-01 21.98
2020-06-01 23.24
2020-07-01 22.39
2020-08-01 22.86
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Offices of Physicians in Riverside-San Bernardino-Ontario, CA ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
    theme_economist()

All Employees: Federal Government: Department of Defense

indicator <-fredr_series_observations(series_id = "SMU06401409091911001",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 5.9
2019-02-01 5.9
2019-03-01 5.9
2019-04-01 5.9
2019-05-01 5.9
2019-06-01 5.9
2019-07-01 6.0
2019-08-01 6.0
2019-09-01 6.0
2019-10-01 6.1
2019-11-01 6.2
2019-12-01 6.0
2020-01-01 6.0
2020-02-01 6.0
2020-03-01 6.0
2020-04-01 6.4
2020-05-01 6.4
2020-06-01 6.4
2020-07-01 6.4
2020-08-01 6.4
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Department of Defense in Riverside-San Bernardino-Ontario, CA ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
 theme(
  panel.background = element_rect(fill = "#BFD5E3", colour = "#6D9EC1",
                                size = 2, linetype = "solid"),
  panel.grid.major = element_line(size = 0.5, linetype = 'solid',
                                colour = "white"), 
  panel.grid.minor = element_line(size = 0.25, linetype = 'solid',
                                colour = "white")
  )

All Employees: Accommodation and Food Services in Riverside-San Bernardino-Ontario, CA

indicator <-fredr_series_observations(series_id = "SMU06401407072000001",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 152.3
2019-02-01 154.5
2019-03-01 156.7
2019-04-01 157.9
2019-05-01 157.4
2019-06-01 156.7
2019-07-01 154.9
2019-08-01 154.1
2019-09-01 153.4
2019-10-01 154.0
2019-11-01 155.7
2019-12-01 154.3
2020-01-01 152.1
2020-02-01 154.7
2020-03-01 149.9
2020-04-01 83.5
2020-05-01 87.2
2020-06-01 104.2
2020-07-01 104.2
2020-08-01 105.4
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Accommodation and Food Services in Riverside-San Bernardino-Ontario, CA ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
    theme_economist()+
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-07-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.02)

All Employees: Leisure and Hospitality in Riverside-San Bernardino-Ontario, CA (MSA)

indicator <-fredr_series_observations(series_id = "RIVE106LEIHN",
        observation_start = as.Date("2019-01-01")) 

indicator[,c(1,3)] %>% kable() %>%
  kable_styling(bootstrap_options = c("striped", "hover", "condensed"))
date value
2019-01-01 174.2
2019-02-01 176.5
2019-03-01 179.2
2019-04-01 179.5
2019-05-01 177.6
2019-06-01 175.8
2019-07-01 173.2
2019-08-01 172.4
2019-09-01 171.9
2019-10-01 172.6
2019-11-01 175.2
2019-12-01 174.6
2020-01-01 172.4
2020-02-01 175.0
2020-03-01 169.8
2020-04-01 94.7
2020-05-01 96.9
2020-06-01 117.7
2020-07-01 117.4
2020-08-01 117.8
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4",size=1) +
  labs(title = "Employment: Leisure and Hospitality in Riverside-San Bernardino-Ontario, CA ", 
       subtitle = str_glue("from {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of People",
       caption = "Data source: FRED Federal Reserve.   Illustration by @JoeLongSanDiego")+
     theme_economist()+
  geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-07-2020'), ymin = -Inf, ymax = Inf),
                   fill = "white", alpha = 0.02)