Initial Unemployment Claims in California (CAICLAIMS)

indicator <-fredr_series_observations(series_id = "CAICLAIMS",
        observation_start = as.Date("2020-01-01")) 

# plotting data
ggplot(indicator)+ 
  
  geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
   labs(title = "Initial Claims in California (CAICLAIMS)", 
       subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
       x="Weekly\nNot seasonnaly adjusted", y="Number",
       caption = "Data source: FRED Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

indicator1 <- tail(indicator,n=8)

indicator1%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator1$date)} through {max(indicator1$date)}"), align = "center") %>%
     hc_title(text = "Initial Claims in California _ last four weeks",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Person")) %>%
   hc_add_theme(hc_theme_economist())

Continued Claims (Insured Unemployment) in California (CACCLAIMS)

indicator <-fredr_series_observations(series_id = "CACCLAIMS",
        observation_start = as.Date("2020-01-01")) 

# plotting data
ggplot(indicator)+ 
     geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +

  labs(title = "Continued Claims (Insured Unemployment) in California (CACCLAIMS)", 
       subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
       x="Weekly\nNot seasonnaly adjusted", y="Number",
       caption = "Data source: FRED Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

indicator1 <- tail(indicator,n=8)

indicator1%>%
    hchart( type = "column",hcaes(x = date, y = value)) %>% hc_colors("steelblue") %>%
    hc_subtitle(text=str_glue("from {min(indicator1$date)} through {max(indicator1$date)}"), align = "center") %>%
     hc_title(text = "Continued Claims in California _ last four weeks",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Persons")) %>%
   hc_add_theme(hc_theme_economist())

All Employees: Manufacturing in California (CAMFGN)

indicator <- fredr(series_id = "CAMFGN", observation_start = as.Date("2010-01-01"))


ggplot(data = indicator, mapping = aes(x = date, y = value)) +
    geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-03-2021'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "All Employees: Manufacturing in California (CAMFGN)", 
       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()

All Employees: Drinking Places (Alcoholic Beverages) in California (SMU06000007072240001)

indicator <- fredr(series_id = "SMU06000007072240001", 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-03-2021'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Employment: Drinking Places (Alcoholic Beverages) in California", 
       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()

All Employees: Restaurants and Other Eating Places in California (SMU06000007072250001)

This industry comprises establishments primarily engaged in one of the following: (1) providing food services to patrons who order and are served while seated (i.e., waiter/waitress service), and pay after eating; (2) providing food services to patrons who generally order or select items (e.g., at a counter, in a buffet line) and pay before eating; or (3) preparing and/or serving a specialty snack (e.g., ice cream, frozen yogurt, cookies) and/or nonalcoholic beverages (e.g., coffee, juices, sodas) for consumption on or near the premises.

indicator <- fredr(series_id = "SMU06000007072250001", 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-03-2021'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Employment: Restaurants and Other Eating Places  in California", 
       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()

All Employees: Limited-Service Restaurants and Other Eating Places in California (SMU06000007072259001)

This U.S. industry comprises establishments primarily engaged in providing food services (except snack and nonalcoholic beverage bars) where patrons generally order or select items and pay before eating. Food and drink may be consumed on premises, taken out, or delivered to the customer’s location. Some establishments in this industry may provide these food services in combination with selling alcoholic beverages.

This industry is comprised of: Carryout restaurants Delicatessen restaurants Drive-in restaurants Family restaurants, limited-service Fast-food restaurants Pizza delivery shops Pizza parlors, limited-service Pizzerias, limited-service (e.g., take-out) Restaurants, carryout Restaurants, fast food Sandwich shops, limited-service Steak houses, limited-service Take out eating places

indicator <- fredr(series_id = "SMU06000007072259001", 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-03-2021'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), color = "blue4") +
    labs(title = "Employment: Fast Restaurants and Other Carryout Eating Places  in California", 
       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()

All Employees: Special Food Services in California (SMU06000007072230001)

7223 - Special Food Services This industry group comprises establishments primarily engaged in providing food services at one or more of the following locations: (1) the customer’s location (2) a location designated by the customer or (3) from motorized vehicles or nonmotorized carts.

indicator <- fredr(series_id = "SMU06000007072230001", 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-03-2021'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), color = "blue4") +
    labs(title = "Employment: Food Catering and Mobile Eating Places  in California", 
       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()

All Employees: Retail Trade: Beer, Wine, and Liquor Stores in California (SMU06000004244530001)

indicator <- fredr(series_id = "SMU06000004244530001", 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-03-2021'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), color = "blue4") +
    labs(title = "Employment: Retail: Beer, Wine, and Liquor Stores in California", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands of Persons",
       caption = "Data source: FRED St. Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

All Employees: Child Day Care Services in California (SMU06000006562440001)

indicator <- fredr(series_id = "SMU06000006562440001", 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-03-2021'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), color = "blue4") +
    labs(title = "Employment: Child Day Care Services in California", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands of Persons",
       caption = "Data source: FRED Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()