All Employees: All Employees, Leisure and Hospitality (CEU7000000001)

indicator <- fredr(series_id = "CEU7000000001", observation_start = as.Date("2019-01-01"))


ggplot(data = indicator, mapping = aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-09-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "Employment: Leisure and Hospitality", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands of Persons",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="All Employment",data = indicator$value) %>% 
    #hc_add_series(name="Female _ Software Developers",data = indicator$female) %>%
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Leisure and Hospitality",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of Persons")) %>%
    hc_add_theme(hc_theme_economist())

All Employees, Food Services and Drinking Places (CEU7072200001)

indicator <- fredr(series_id = "CEU7072200001", observation_start = as.Date("2019-01-01"))


ggplot(data = indicator, mapping = aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-09-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "Employment: Food Services and Drinking Places", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands of Persons",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="All Employment",data = indicator$value) %>% 
    #hc_add_series(name="Female _ Software Developers",data = indicator$female) %>%
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Food Services and Drinking Places",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of Persons")) %>%
    hc_add_theme(hc_theme_economist())

All Employees, Arts, Entertainment, and Recreation (CEU7071000001)

indicator <- fredr(series_id = "CEU7071000001", observation_start = as.Date("2019-01-01"))


ggplot(data = indicator, mapping = aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-09-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "Employment: Arts, Entertainment, and Recreation", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands of Persons",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="All Employment",data = indicator$value) %>% 
    #hc_add_series(name="Female _ Software Developers",data = indicator$female) %>%
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Arts, Entertainment, and Recreation",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of Persons")) %>%
    hc_add_theme(hc_theme_economist())

All Employees, Performing Arts and Spectator Sports (CEU7071100001)

indicator <- fredr(series_id = "CEU7071100001", observation_start = as.Date("2019-01-01"))


ggplot(data = indicator, mapping = aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-09-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "Employment: Performing Arts and Spectator Sports ", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands of Persons",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="All Employment",data = indicator$value) %>% 
    #hc_add_series(name="Female _ Software Developers",data = indicator$female) %>%
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Performing Arts and Spectator Sports ",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of Persons")) %>%
    hc_add_theme(hc_theme_economist())

All Employees, Amusements, Gambling, and Recreation (CEU7071300001)

indicator <- fredr(series_id = "CEU7071300001", observation_start = as.Date("2019-01-01"))


ggplot(data = indicator, mapping = aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-09-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "Employment: Amusements, Gambling, and Recreation ", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands of Persons",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="All Employment",data = indicator$value) %>% 
    #hc_add_series(name="Female _ Software Developers",data = indicator$female) %>%
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Amusements, Gambling, and Recreation ",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of Persons")) %>%
    hc_add_theme(hc_theme_economist())

All Employees, Museums, Historical Sites, and Similar Institutions (CEU7071200001)

indicator <- fredr(series_id = "CEU7071200001", observation_start = as.Date("2019-01-01"))


ggplot(data = indicator, mapping = aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-09-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "Employment: Museums, Historical Sites, and Similar Institutions ", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands of Persons",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="All Employment",data = indicator$value) %>% 
    #hc_add_series(name="Female _ Software Developers",data = indicator$female) %>%
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Museums, Historical Sites, and Similar Institutions ",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of Persons")) %>%
    hc_add_theme(hc_theme_economist())

All Employees: Accommodation and Food Services in Dallas-Fort Worth-Arlington, TX (MSA) (SMU48191007072000001)

indicator <- fredr(series_id = "SMU48191007072000001", observation_start = as.Date("2019-01-01"))


ggplot(data = indicator, mapping = aes(x = date, y = value)) +
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "Accommodation and Food Services in Dallas-Fort Worth-Arlington, TX ", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of Persons",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="All Employment",data = indicator$value) %>% 
    #hc_add_series(name="Female _ Software Developers",data = indicator$female) %>%
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Accommodation and Food Services in Dallas-Fort Worth-Arlington, TX",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of Persons")) %>%
    hc_add_theme(hc_theme_economist())

All Employees: Accommodation and Food Services in Denver-Aurora-Lakewood, CO (MSA) (SMU08197407072200001SA)

indicator <- fredr(series_id = "SMU08197407072200001", observation_start = as.Date("2019-01-01"))


ggplot(data = indicator, mapping = aes(x = date, y = value)) +
    geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "All Employees: Accommodation and Food Services Denver-Aurora-Lakewood, CO (MSA) ", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of Persons",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="All Employment",data = indicator$value) %>% 
    #hc_add_series(name="Female _ Software Developers",data = indicator$female) %>%
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "All Employees: Accommodation and Food Services in Denver-Aurora-Lakewood, CO (MSA)",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of Persons")) %>%
    hc_add_theme(hc_theme_economist())

All Employees: Food Services and Drinking Places in Denver-Aurora-Lakewood, CO (MSA) (SMU08197407072200001SA)

indicator <- fredr(series_id = "SMU08197407072200001", observation_start = as.Date("2019-01-01"))


ggplot(data = indicator, mapping = aes(x = date, y = value)) +
    geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "All Employees: Food Services & Drinking Places in Denver-Aurora-Lakewood, CO ", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands of Persons",
       caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="All Employment",data = indicator$value) %>% 
    #hc_add_series(name="Female _ Software Developers",data = indicator$female) %>%
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "All Employees: Food Services and Drinking Places in Denver-Aurora-Lakewood, CO (MSA)",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of Persons")) %>%
    hc_add_theme(hc_theme_economist())