All Employees: Food Services and Drinking in California (SMU06000007072200001)

indicator <-fredr_series_observations(series_id = "SMU06000007072200001",
        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 1424
2019-02-01 1442
2019-03-01 1456
2019-04-01 1469
2019-05-01 1481
2019-06-01 1482
2019-07-01 1481
2019-08-01 1484
2019-09-01 1473
2019-10-01 1476
2019-11-01 1474
2019-12-01 1476
2020-01-01 1451
2020-02-01 1467
2020-03-01 1406
2020-04-01 772
2020-05-01 880
2020-06-01 1094
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=1) +
  labs(title = "Employment: Food/Drink Places in California", 
       subtitle = str_glue("Employment 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()

indicator%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Food/Drink Places in California",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of persons")) %>%
   hc_add_theme(hc_theme_economist())
## Warning: `parse_quosure()` is deprecated as of rlang 0.2.0.
## Please use `parse_quo()` instead.
## This warning is displayed once per session.
## Warning: `group_by_()` is deprecated as of dplyr 0.7.0.
## Please use `group_by()` instead.
## See vignette('programming') for more help
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_warnings()` to see where this warning was generated.
## Warning: `select_()` is deprecated as of dplyr 0.7.0.
## Please use `select()` instead.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_warnings()` to see where this warning was generated.
## Warning: `as_data_frame()` is deprecated as of tibble 2.0.0.
## Please use `as_tibble()` instead.
## The signature and semantics have changed, see `?as_tibble`.
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_warnings()` to see where this warning was generated.

### All Employees: Food Services and Drinking Places in Nevada (SMU32000007072200001) ### Caution: Nevada segregates futher this classification into different subcategories

indicator <-fredr_series_observations(series_id = "SMU32000007072200001",
        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 129
2019-02-01 130
2019-03-01 132
2019-04-01 133
2019-05-01 134
2019-06-01 133
2019-07-01 133
2019-08-01 133
2019-09-01 133
2019-10-01 131
2019-11-01 130
2019-12-01 131
2020-01-01 130
2020-02-01 133
2020-03-01 127
2020-04-01 57
2020-05-01 72
2020-06-01 110
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=1) +
  labs(title = "Employment: Food/Drinking Places in Nevada ", 
       subtitle = str_glue("Employment 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()

indicator%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Food Services & Drinking Places in Nevada",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of persons")) %>%
   hc_add_theme(hc_theme_economist())

Food Services and Drinking Places in Texas (SMU48000007072200001)

indicator <-fredr_series_observations(series_id = "SMU48000007072200001",
        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 1074
2019-02-01 1091
2019-03-01 1103
2019-04-01 1114
2019-05-01 1120
2019-06-01 1124
2019-07-01 1121
2019-08-01 1123
2019-09-01 1115
2019-10-01 1124
2019-11-01 1114
2019-12-01 1114
2020-01-01 1102
2020-02-01 1122
2020-03-01 1088
2020-04-01 670
2020-05-01 870
2020-06-01 968
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=1) +
  labs(title = "Employment: Food/Drink Places in Texas", 
       subtitle = str_glue("Employment 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()

indicator%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Food Services & Drinking Places in Texas",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of persons")) %>%
   hc_add_theme(hc_theme_economist())

### All Employees: Food Services and Drinking Places in Arizona (SMU04000007072200001)

indicator <-fredr_series_observations(series_id = "SMU04000007072200001",
        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 236
2019-02-01 240
2019-03-01 244
2019-04-01 244
2019-05-01 241
2019-06-01 235
2019-07-01 232
2019-08-01 237
2019-09-01 238
2019-10-01 242
2019-11-01 242
2019-12-01 244
2020-01-01 242
2020-02-01 247
2020-03-01 239
2020-04-01 155
2020-05-01 194
2020-06-01 213
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=1) +
  labs(title = "Employment: Food/Drinking Places in Arizona", 
       subtitle = str_glue("Employment 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()

indicator%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Food Services & Drinking Places in Arizona",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of persons")) %>%
   hc_add_theme(hc_theme_economist())

All Employees: Food Services and Drinking Places in Hawaii (SMU15000007072200001)

indicator <-fredr_series_observations(series_id = "SMU15000007072200001",
        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 70
2019-02-01 70
2019-03-01 70
2019-04-01 70
2019-05-01 70
2019-06-01 70
2019-07-01 70
2019-08-01 71
2019-09-01 70
2019-10-01 70
2019-11-01 70
2019-12-01 72
2020-01-01 72
2020-02-01 71
2020-03-01 70
2020-04-01 30
2020-05-01 33
2020-06-01 40
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=1) +
  labs(title = "Employment: Food/Drinking Places in Hawaii", 
       subtitle = str_glue("Employment 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()

indicator%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Food Services & Drinking Places in Hawaii",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of persons")) %>%
   hc_add_theme(hc_theme_economist())

All Employees: Food Services and Drinking Places in Florida (SMU12000007072200001)

indicator <-fredr_series_observations(series_id = "SMU12000007072200001",
        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 812
2019-02-01 830
2019-03-01 840
2019-04-01 837
2019-05-01 833
2019-06-01 818
2019-07-01 812
2019-08-01 814
2019-09-01 802
2019-10-01 806
2019-11-01 817
2019-12-01 823
2020-01-01 819
2020-02-01 838
2020-03-01 800
2020-04-01 463
2020-05-01 599
2020-06-01 697
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=1) +
  labs(title = "Employment: Food/Drinking Places in Florida", 
       subtitle = str_glue("Employment 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()

indicator%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Food Services & Drinking Places in Florida",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of persons")) %>%
   hc_add_theme(hc_theme_economist())

### All Employees: Food Services and Drinking Places in New York State (SMU36000007072200001)

indicator <-fredr_series_observations(series_id = "SMU36000007072200001",
        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 647
2019-02-01 653
2019-03-01 661
2019-04-01 676
2019-05-01 691
2019-06-01 700
2019-07-01 692
2019-08-01 689
2019-09-01 688
2019-10-01 680
2019-11-01 680
2019-12-01 678
2020-01-01 648
2020-02-01 660
2020-03-01 606
2020-04-01 216
2020-05-01 276
2020-06-01 352
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=1) +
  labs(title = "Employment: Food/Drinking Places in New York", 
       subtitle = str_glue("Employment 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()

indicator%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Food Services & Drinking Places in New York State",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of persons")) %>%
   hc_add_theme(hc_theme_economist())

### All Employees: Food Services and Drinking Places in Massachusetts (SMU25000007072200001)

indicator <-fredr_series_observations(series_id = "SMU25000007072200001",
        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 260
2019-02-01 260
2019-03-01 263
2019-04-01 269
2019-05-01 279
2019-06-01 289
2019-07-01 288
2019-08-01 288
2019-09-01 278
2019-10-01 275
2019-11-01 269
2019-12-01 269
2020-01-01 262
2020-02-01 262
2020-03-01 244
2020-04-01 91
2020-05-01 125
2020-06-01 162
# plotting data
indicator %>% ggplot() + geom_line(mapping = aes(x=date,y=value), 
                              color = "red3",size=1) +
  labs(title = "Employment: Food/Drinking Places in Massachusetts ", 
       subtitle = str_glue("Employment 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()

indicator%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Employment: Food Services & Drinking Places in Massachusetts",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of persons")) %>%
   hc_add_theme(hc_theme_economist())