Chicago Fed Survey of Business Conditions: Activity Index (CFSBCACTIVITY)
indicator <-fredr_series_observations(series_id = "CFSBCACTIVITY",
observation_start = as.Date("2015-01-01"))
# plotting data
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=enddate, ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(mapping = aes(x=date,y=value),
color = "blue4") +
labs(title = "Chicago Fed Survey of Business Conditions: Activity Index",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Index",
caption = "Source: FRED St. Louis Federal Reserve\nIllustration 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 = "Chicago Fed Survey of Business Conditions: Activity Index ",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Source: FRED St. Louis Federal Reserve * Illustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Index")) %>%
hc_add_theme(hc_theme_economist())
Chicago Fed Survey of Business Conditions: Manufacturing Activity Index (CFSBCACTIVITYMFG)
indicator <-fredr_series_observations(series_id = "CFSBCACTIVITYMFG",
observation_start = as.Date("2019-01-01"))
# plotting data
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=enddate, ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(mapping = aes(x=date,y=value),
color = "red4") +
labs(title = "Chicago Fed Survey of Business Conditions: Manufacturing Activity Index ",
subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Index",
caption = "Source: FRED St. Louis 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 = "Chicago Fed Survey of Business Conditions: Manufacturing Activity Index",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Source: FRED St. Louis Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Index")) %>%
hc_add_theme(hc_theme_economist())
All Employees, Manufacturing (MANEMP)
indicator <-fredr_series_observations(series_id = "CALEIH",
observation_start = as.Date("2015-01-01"))
# plotting data
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=enddate, ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(mapping = aes(x=date,y=value),
color = "red4") +
labs(title = "National Employment, Manufacturing",
subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Thousands of Persons",
caption = "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 = "Manufacturing Employment",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve (CALEIH) _ Illustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Thousands of Persons")) %>%
hc_add_theme(hc_theme_economist())
Manufacturers’ New Orders: Consumer Durable Goods (ACDGNO)
indicator <-fredr_series_observations(series_id = "ACDGNO",
observation_start = as.Date("2015-01-01"))
# plotting data
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=enddate, ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(mapping = aes(x=date,y=value),
color = "red4") +
labs(title = "Manufacturers' New Orders: Consumer Durable Goods",
subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Millions of Dollars",
caption = "Source: FRED St. Louis Federal Reserve\nIllustration 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 = "Manufacturers' New Orders: Consumer Durable Goods",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Millions of Dollars")) %>%
hc_add_theme(hc_theme_economist())
Manufacturers’ New Orders: Durable Goods (DGORDER)
indicator <-fredr_series_observations(series_id = "DGORDER",
observation_start = as.Date("2015-01-01"))
# plotting data
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=enddate, ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(mapping = aes(x=date,y=value),
color = "red4") +
labs(title = "Manufacturers' New Orders: Durable Goods",
subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Millions of Dollars",
caption = "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 = "Manufacturers' New Orders: Durable Goods",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Millions of Dollars")) %>%
hc_add_theme(hc_theme_economist())
Capacity Utilization: Manufacturing (NAICS) (MCUMFN)
indicator <-fredr_series_observations(series_id = "MCUMFN",
observation_start = as.Date("2015-01-01"))
# plotting data
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=enddate, ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(mapping = aes(x=date,y=value),
color = "red4") +
labs(title = "Capacity Utilization: Manufacturing",
subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Percent of Capacity",
caption = "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 = "Capacity Utilization: Manufacturing",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Percent of Capacity")) %>%
hc_add_theme(hc_theme_economist())
Manufacturers: Inventories to Sales Ratio (MNFCTRIRSA)
indicator <-fredr_series_observations(series_id = "MNFCTRIRSA",
observation_start = as.Date("2015-01-01"))
# plotting data
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=enddate, ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(mapping = aes(x=date,y=value),
color = "red4") +
labs(title = "Manufacturers: Inventories to Sales Ratio",
subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Ratio",
caption = "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 = "Manufacturers: Inventories to Sales Ratio",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Ratio")) %>%
hc_add_theme(hc_theme_economist())
Industrial Production: Manufacturing (NAICS) (IPMAN)
indicator <-fredr_series_observations(series_id = "IPMAN",
observation_start = as.Date("2015-01-01"))
# plotting data
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=enddate, ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(mapping = aes(x=date,y=value),
color = "green4") +
labs(title = "Industrial Production: Manufacturing",
subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Index 2012=100",
caption = "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 = "Industrial Production: Manufacturing",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Index 2012=100")) %>%
hc_add_theme(hc_theme_economist())
Producer Price Index by Industry: Food Manufacturing (PCU311311)
indicator <-fredr_series_observations(series_id = "PCU311311",
observation_start = as.Date("2015-01-01"))
# plotting data
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=enddate, ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(mapping = aes(x=date,y=value),
color = "blue4") +
labs(title = "Wholesale Price Index: Food Manufacturing",
subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Index Dec 1984=100",
caption = "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 = "Wholesale Price Index: Food Manufacturing",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Index Dec 1984=100")) %>%
hc_add_theme(hc_theme_economist())
Capacity Utilization: Durable Manufacturing: Iron and steel products (CAPUTLG3311A2S)
indicator <-fredr_series_observations(series_id = "CAPUTLG3311A2S",
observation_start = as.Date("2015-01-01"))
# plotting data
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=enddate, ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(mapping = aes(x=date,y=value),
color = "blue4") +
labs(title = "Capacity Utilization: Iron and steel products",
subtitle = str_glue("Monthly from {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Percent of Capacity",
caption = "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 = "Capacity Utilization: Iron and steel products",
style = list(fontWeight = "bold", fontSize = "20px"),
align = "center") %>%
hc_credits(enabled = TRUE,text = "Source: FRED Federal Reserve _ Illustration by @JoeLongSanDiego") %>%
hc_yAxis(title = list(text = "Percent of Capacity")) %>%
hc_add_theme(hc_theme_economist())