Job Openings: Total Nonfarm (JTUJOL)

indicator <- fredr(series_id = "JTUJOL", 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('25-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "Job Openings: Total Nonfarm (JTUJOL)", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands",
       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="Job Openings: Total Nonfarm (JTUJOL)",data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Job Openings: Total Nonfarm (JTUJOL) ",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())

Job Openings: Manufacturing (JTU3000JOL)

indicator <- fredr(series_id = "JTU3000JOL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = " Job Openings: Manufacturing (JTU3000JOL)", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands",
       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=" ",data = indicator$value) %>% 
  
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = " Job Openings: Manufacturing (JTU3000JOL) ",
             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 ")) %>%
    hc_add_theme(hc_theme_economist())

Hires: Manufacturing (JTU3000HIL)

indicator <- fredr(series_id = "JTU3000HIL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Hires: Manufacturing (JTU3000HIL)", 
       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.   Illustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="Hires: Manufacturing",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 = "Hires: Manufacturing (JTU3000HIL) ",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands of Persons")) %>%
    hc_add_theme(hc_theme_economist())

Job Openings: Trade, Transportation, and Utilities (JTU4000JOL)

indicator <- fredr(series_id = "JTU4000JOL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Job Openings: Trade, Transportation, and Utilities (JTU4000JOL)", 
       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.   Illustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="Job Openings: Trade, Transportation, and Utilities",data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Job Openings: Trade, Transportation, and Utilities (JTU4000JOL) ",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())

Job Openings: Accommodation and Food Services (JTU7200JOL)

indicator <- fredr(series_id = "JTU7200JOL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Job Openings: Accommodation and Food Services (JTU7200JOL)", 
       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.   Illustration by @JoeLongSanDiego")+
    theme_economist()

highchart() %>% 
    hc_chart(type = "column") %>%
    hc_xAxis(categories = indicator$date) %>%
    hc_add_series(name="Job Openings: Accommodation and Food Services (JTU7200JOL)",data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Job Openings: Accommodation and Food Services (JTU7200JOL) ",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())

Job Openings: Education and Health Services (JTU6000JOL)

indicator <- fredr(series_id = "JTU6000JOL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Job Openings: Education and Health Services (JTU6000JOL)", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands ",
       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="Job Openings: Education and Health Services (JTU6000JOL)",data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Job Openings: Education and Health Services (JTU6000JOL) ",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())

Job Openings: Finance and Insurance (JTU5200JOL)

indicator <- fredr(series_id = "JTU5200JOL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Job Openings: Finance and Insurance (JTU5200JOL)", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands ",
       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="Job Openings: Finance and Insurance (JTU5200JOL)",data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Job Openings: Finance and Insurance (JTU5200JOL)",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())

Layoffs and Discharges: Total Nonfarm (JTULDL)

indicator <- fredr(series_id = "JTULDL", 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('25-11-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "red4") +
    labs(title = "Layoffs and Discharges: Total Nonfarm (JTULDL)", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands",
       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="Layoffs and Discharges: Total Nonfarm (JTULDL)",data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Layoffs and Discharges: Total Nonfarm (JTULDL) ",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())

Layoffs and Discharges: Leisure and Hospitality (JTU7000LDL)

indicator <- fredr(series_id = "JTU7000LDL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Layoffs and Discharges: Leisure and Hospitality (JTU7000LDL)", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands ",
       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="Layoffs and Discharges: Leisure and Hospitality (JTU7000LDL)",data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Layoffs and Discharges: Leisure and Hospitality (JTU7000LDL)",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())

Layoffs and Discharges: Manufacturing (JTU3000LDL)

indicator <- fredr(series_id = "JTU3000LDL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Layoffs and Discharges: Manufacturing (JTU3000LDL)", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands ",
       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="Layoffs and Discharges: Manufacturing (JTU3000LDL)",data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Layoffs and Discharges: Manufacturing (JTU3000LDL)",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())

Layoffs and Discharges: Health Care and Social Assistance (JTU6200LDL)

indicator <- fredr(series_id = "JTU3000LDL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Layoffs and Discharges: Manufacturing (JTU3000LDL)", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands ",
       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="Layoffs and Discharges: Manufacturing (JTU3000LDL)",data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Layoffs and Discharges: Manufacturing (JTU3000LDL)",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())

Layoffs and Discharges: Arts, Entertainment, and Recreation (JTU7100LDL)

indicator <- fredr(series_id = "JTU7100LDL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Layoffs and Discharges: Arts, Entertainment, and Recreation (JTU7100LDL)", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands ",
       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="Layoffs and Discharges: Arts, Entertainment, and Recreation (JTU7100LDL)",
                  data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Layoffs and Discharges: Arts, Entertainment, and Recreation (JTU7100LDL)",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())

Layoffs and Discharges: Transportation, Warehousing, and Utilities (JTU480099LDL)

indicator <- fredr(series_id = "JTU480099LDL", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
                   fill = "lightyellow", alpha = 0.02)+
   geom_line(mapping = aes(x=date,y=value), 
                              color = "blue4") +
    labs(title = "Layoffs and Discharges: Transportation, Warehousing, and Utilities (JTU480099LDL)", 
       subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Time", y="Thousands ",
       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="Layoffs and Discharges: Transportation, Warehousing, and Utilities (JTU480099LDL)",
                  data = indicator$value) %>% 
   
  hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
     hc_title(text = "Layoffs and Discharges: Transportation, Warehousing, and Utilities (JTU480099LDL)",
             style = list(fontWeight = "bold", fontSize = "20px"),
             align = "center")  %>%
  hc_credits(enabled = TRUE,text = "Data Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
   hc_yAxis(title = list(text = "Thousands ")) %>%
    hc_add_theme(hc_theme_economist())