indicator <- fredr(series_id = "IPB50001N", 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('25-11-2020'), ymin = -Inf, ymax = Inf),
fill = "lightyellow", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),
color = "red4") +
labs(title = "Industrial Production: Total Index (IPB50001N)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y="Index 2012=100",
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="Industrial Production: Total Index (IPB50001N)",
data = tail(indicator$value,n=24)) %>%
hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
hc_title(text = "Industrial Production: Total Index (IPB50001N)",
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 = "Index 2012=100")) %>%
hc_add_theme(hc_theme_economist())
indicator <- fredr(series_id = "TCU", 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('25-11-2020'), ymin = -Inf, ymax = Inf),
fill = "lightyellow", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),
color = "red4") +
labs(title = "Capacity Utilization: Total Index (TCU)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y="Percent",
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="Capacity Utilization: Total Index (TCU)",
data = tail(indicator$value,n=24)) %>%
hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
hc_title(text = "Capacity Utilization: Total Index (TCU)",
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 = "Percent")) %>%
hc_add_theme(hc_theme_economist())
indicator <- fredr(series_id = "IPGMFN", 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('25-11-2020'), ymin = -Inf, ymax = Inf),
fill = "lightyellow", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),
color = "red4") +
labs(title = "Industrial Production: Manufacturing (NAICS) (IPGMFN)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y="Index 2012=100",
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="Industrial Production: Manufacturing (NAICS) (IPGMFN)",
data = tail(indicator$value,n=24)) %>%
hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
hc_title(text = "Industrial Production: Manufacturing (NAICS) (IPGMFN)",
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 = "Index 2012=100")) %>%
hc_add_theme(hc_theme_economist())
indicator <- fredr(series_id = "MCUMFN", 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('25-11-2020'), ymin = -Inf, ymax = Inf),
fill = "lightyellow", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),
color = "red4") +
labs(title = "Capacity Utilization: Manufacturing (NAICS) (MCUMFN)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y="Percent",
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="Capacity Utilization: Manufacturing (NAICS) (MCUMFN)",
data = tail(indicator$value,n=24)) %>%
hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
hc_title(text = "Capacity Utilization: Manufacturing (NAICS) (MCUMFN)",
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 = "Percent")) %>%
hc_add_theme(hc_theme_economist())
indicator <- fredr(series_id = "IPG3361T3N", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
fill = "lightyellow", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),
color = "blue4") +
labs(title = "Industrial Production: Motor Vehicles and Parts (NAICS = 3361-3)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y="Index 2012=100",
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="Industrial Production: Motor Vehicles and Parts (NAICS = 3361-3) ",
data = tail(indicator$value,n=24)) %>%
hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
hc_title(text = "Industrial Production: Motor Vehicles and Parts (NAICS = 3361-3)",
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 = "Index 2012=100 ")) %>%
hc_add_theme(hc_theme_economist())
indicator <- fredr(series_id = "CAPUTLG3311A2S", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
fill = "lightyellow", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),
color = "blue4") +
labs(title = "Capacity Utilization: Manufacturing: Durable Goods: Iron and Steel Products",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y="Percent",
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="Capacity Utilization: Manufacturing: Durable Goods: Iron and Steel Products ",
data = tail(indicator$value,n=24)) %>%
hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
hc_title(text = "Capacity Utilization: Manufacturing: Durable Goods: Iron and Steel Products",
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 = "Percent ")) %>%
hc_add_theme(hc_theme_economist())
(IPG334N)
indicator <- fredr(series_id = "IPG334N", 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('25-12-2020'), ymin = -Inf, ymax = Inf),
fill = "lightyellow", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),
color = "blue4") +
labs(title = "Industrial Production: Computer and Electronic Product (NAICS = 334)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y="Index 2012=100",
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="Industrial Production: Computer and Electronic Product (NAICS = 334) ",
data = tail(indicator$value,n=24)) %>%
hc_subtitle(text=str_glue("From {min(indicator$date)} through {max(indicator$date)}"), align = "center") %>%
hc_title(text = "Industrial Production: Computer and Electronic Product (NAICS = 334)",
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 = "Index 2012=100 ")) %>%
hc_add_theme(hc_theme_economist())
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())
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())
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())
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())