National Initial Unemployment Claims (ICNSA)

usa_claims <- 
  "ICNSA" %>% 
  tq_get(get = "economic.data", 
         from = "2019-01-01") %>% 
  rename(claims = price) 


  usa_claims %>% 
    ggplot(aes(x = date, y = claims)) +
     geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
    geom_line(color = "blue",size=1) + 
    labs(
      x = "Weekly",
      y = "Numbers",
      title = "New Initial Unemployment (Insured) Claims _ National (ICNSA)",
      caption = "Data source: FRED Philadelphia Federal Reserve\nIllustration by @JoeLongSanDiego",
      subtitle = str_glue("From {min(usa_claims$date)} through {max(usa_claims$date)}")
    ) +
    theme_economist() +
    scale_y_continuous(labels = scales::comma)

Continued Unemployment Claims (Insured Unemployment) (CCNSA)

usa_claims <- 
  "CCNSA" %>% 
  tq_get(get = "economic.data", 
         from = "2019-01-01") %>% 
  rename(claims = price) 


  usa_claims %>% 
    ggplot(aes(x = date, y = claims)) +
     geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
    geom_line(color = "blue",size=1) + 
    labs(
      x = "",
      y = "Number",
      title = "Continued Unemployment (Insured) Claims _ National (UNRATE)",
      caption = "Data source: FRED Philadelphia Federal Reserve\nIllustration by @JoeLongSanDiego",
      subtitle = str_glue("From {min(usa_claims$date)} through {max(usa_claims$date)}")
    ) +
    theme_economist() +
    scale_y_continuous(labels = scales::comma)

National Unemployment Rate (UNRATE)

usa_claims <- 
  "UNRATE" %>% 
  tq_get(get = "economic.data", 
         from = "2019-01-01") %>% 
  rename(claims = price) 


  usa_claims %>% 
    ggplot(aes(x = date, y = claims)) +
     geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
    geom_line(color = "blue",size=1) + 
    labs(
      x = "Monthly",
      y = "Percent",
      title = "New Unemployment (Insured) Claims _ National (UNRATE)",
      caption = "Data source: FRED Philadelphia Federal Reserve\nIllustration by @JoeLongSanDiego",
      subtitle = str_glue("From {min(usa_claims$date)} through {max(usa_claims$date)}")
    ) +
    theme_economist() +
    scale_y_continuous(labels = scales::comma)

Labor Force Participation Rate (LNU01300000)

indicator <- 
  "LNU01300000" %>% 
  tq_get(get = "economic.data", 
         from = "2019-01-01") 
   


  indicator %>% 
    ggplot(aes(x = date, y = price)) +
     geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
    geom_line(color = "blue",size=1) + 
    labs(
      x = "Monthly",
      y = "Percent",
      title = "Labor Force Participation Rate (LNU01300000)",
      caption = "Data source: FRED Philadelphia Federal Reserve\nIllustration by @JoeLongSanDiego",
      subtitle = str_glue("From {min(usa_claims$date)} through {max(usa_claims$date)}")
    ) +
    theme_economist() +
    scale_y_continuous(labels = scales::comma)

Labor Force Participation Rate - Women (LNU01300002)

indicator <- 
  "LNU01300002" %>% 
  tq_get(get = "economic.data", 
         from = "2019-01-01") 
   


  indicator %>% 
    ggplot(aes(x = date, y = price)) +
     geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
    geom_line(color = "blue",size=1) + 
    labs(
      x = "Monthly",
      y = "Percent",
      title = "Women _ Labor Force Participation Rate (LNU01300002)",
      caption = "Data source: FRED Philadelphia Federal Reserve\nIllustration by @JoeLongSanDiego",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}")
    ) +
    theme_economist() +
    scale_y_continuous(labels = scales::comma)

Labor Force Participation Rate - Men (LNU01300001)

indicator <- 
  "LNU01300002" %>% 
  tq_get(get = "economic.data", 
         from = "2000-01-01") 
   


  indicator %>% 
    ggplot(aes(x = date, y = price)) +
     geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
    geom_line(color = "blue",size=1) + 
    labs(
      x = "Monthly",
      y = "Percent",
      title = "Men\nLabor Force Participation Rate (LNU01300001)",
      caption = "Data source: FRED Philadelphia Federal Reserve\nIllustration by @JoeLongSanDiego",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}")
    ) +
    theme_economist() +
    scale_y_continuous(labels = scales::comma)

Labor Force Participation Rate - Black or African American (LNU01300006)

indicator <- 
  "LNU01300006" %>% 
  tq_get(get = "economic.data", 
         from = "1980-01-01") 
   


  indicator %>% 
    ggplot(aes(x = date, y = price)) +
     geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
    geom_line(color = "blue",size=1) + 
    labs(
      x = "Monthly",
      y = "Percent",
      title = "Black or African American\nLabor Force Participation Rate (LNU01300006)",
      caption = "Data source: FRED Philadelphia Federal Reserve\nIllustration by @JoeLongSanDiego",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}")
    ) +
    theme_economist() +
    scale_y_continuous(labels = scales::comma)

Labor Force Participation Rate - Hispanic or Latino (LNU01300009)

indicator <- 
  "LNU01300009" %>% 
  tq_get(get = "economic.data", 
         from = "1980-01-01") 
   


  indicator %>% 
    ggplot(aes(x = date, y = price)) +
     geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
    geom_line(color = "blue",size=1) + 
    labs(
      x = "Monthly",
      y = "Percent",
      title = "Hispanic or Latino\nLabor Force Participation Rate (LNU01300009)",
      caption = "Data source: FRED Philadelphia Federal Reserve\nIllustration by @JoeLongSanDiego",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}")
    ) +
    theme_economist() +
    scale_y_continuous(labels = scales::comma)

Labor Force Participation Rate - White (LNU01300003)

indicator <- 
  "LNU01300003" %>% 
  tq_get(get = "economic.data", 
         from = "1980-01-01") 
   


  indicator %>% 
    ggplot(aes(x = date, y = price)) +
     geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
    geom_line(color = "blue",size=1) + 
    labs(
      x = "Monthly",
      y = "Percent",
      title = "Caucasian\nLabor Force Participation Rate (LNU01300003)",
      caption = "Data source: FRED Philadelphia Federal Reserve\nIllustration by @JoeLongSanDiego",
      subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}")
    ) +
    theme_economist() +
    scale_y_continuous(labels = scales::comma)