Industrial Production: Total Index (IPB50001N)
Date of data release : October 16, 2020 by FRED St. Louis Federal Reserve
symbol <-fredr_series_observations(series_id = "IPB50001N",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
date
|
value
|
2019-01-01
|
109.72
|
2019-02-01
|
109.32
|
2019-03-01
|
109.76
|
2019-04-01
|
107.43
|
2019-05-01
|
107.94
|
2019-06-01
|
110.76
|
2019-07-01
|
108.83
|
2019-08-01
|
112.05
|
2019-09-01
|
110.11
|
2019-10-01
|
108.82
|
2019-11-01
|
109.23
|
2019-12-01
|
109.18
|
2020-01-01
|
108.57
|
2020-02-01
|
109.11
|
2020-03-01
|
104.41
|
2020-04-01
|
89.05
|
2020-05-01
|
90.67
|
2020-06-01
|
98.81
|
2020-07-01
|
101.24
|
2020-08-01
|
104.02
|
2020-09-01
|
101.25
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
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()

Industrial Production Index (INDPRO) Index 2012=100, Monthly, Seasonally Adjusted
symbol <-fredr_series_observations(series_id = "INDPRO",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
date
|
value
|
2019-01-01
|
110.12
|
2019-02-01
|
109.56
|
2019-03-01
|
109.68
|
2019-04-01
|
108.99
|
2019-05-01
|
109.23
|
2019-06-01
|
109.28
|
2019-07-01
|
109.09
|
2019-08-01
|
109.85
|
2019-09-01
|
109.47
|
2019-10-01
|
109.03
|
2019-11-01
|
110.04
|
2019-12-01
|
109.65
|
2020-01-01
|
109.18
|
2020-02-01
|
109.30
|
2020-03-01
|
104.52
|
2020-04-01
|
91.27
|
2020-05-01
|
91.93
|
2020-06-01
|
97.61
|
2020-07-01
|
101.70
|
2020-08-01
|
102.15
|
2020-09-01
|
101.51
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = "Industrial Production Index (INDPRO) Index",
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()

Capacity Utilization: Manufacturing (SIC) (CUMFNS) Percent of Capacity, monthly
symbol <-fredr_series_observations(series_id = "CUMFNS",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
date
|
value
|
2019-01-01
|
76.74
|
2019-02-01
|
76.28
|
2019-03-01
|
76.16
|
2019-04-01
|
75.41
|
2019-05-01
|
75.39
|
2019-06-01
|
75.72
|
2019-07-01
|
75.32
|
2019-08-01
|
75.69
|
2019-09-01
|
75.11
|
2019-10-01
|
74.60
|
2019-11-01
|
75.20
|
2019-12-01
|
75.25
|
2020-01-01
|
75.19
|
2020-02-01
|
75.16
|
2020-03-01
|
71.37
|
2020-04-01
|
60.09
|
2020-05-01
|
62.24
|
2020-06-01
|
67.02
|
2020-07-01
|
69.84
|
2020-08-01
|
70.69
|
2020-09-01
|
70.51
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = "Capacity Utilization: Manufacturing",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y="Percent of Capacity",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()+
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-07-2020'), ymin = -Inf, ymax = Inf),
fill = "lightblue", alpha = 0.02)

Capacity Utilization : Total Industry (TCU) Monthly. Percent Capacity
symbol <-fredr_series_observations(series_id = "TCU",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
date
|
value
|
2019-01-01
|
79.00
|
2019-02-01
|
78.46
|
2019-03-01
|
78.40
|
2019-04-01
|
77.76
|
2019-05-01
|
77.80
|
2019-06-01
|
77.69
|
2019-07-01
|
77.42
|
2019-08-01
|
77.84
|
2019-09-01
|
77.43
|
2019-10-01
|
76.99
|
2019-11-01
|
77.57
|
2019-12-01
|
77.17
|
2020-01-01
|
76.88
|
2020-02-01
|
76.93
|
2020-03-01
|
73.56
|
2020-04-01
|
64.24
|
2020-05-01
|
64.72
|
2020-06-01
|
68.74
|
2020-07-01
|
71.64
|
2020-08-01
|
71.98
|
2020-09-01
|
71.54
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = "Capacity Utilization Index: Total Industry (TCU)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="percent",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()

Industrial Production: Manufacturing (NAICS) (IPGMFN) Index 2012=100, Monthly
symbol <-fredr_series_observations(series_id = "IPGMFN",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
date
|
value
|
2019-01-01
|
104.33
|
2019-02-01
|
105.52
|
2019-03-01
|
106.91
|
2019-04-01
|
105.68
|
2019-05-01
|
105.70
|
2019-06-01
|
108.15
|
2019-07-01
|
103.77
|
2019-08-01
|
107.68
|
2019-09-01
|
106.66
|
2019-10-01
|
106.30
|
2019-11-01
|
105.77
|
2019-12-01
|
104.51
|
2020-01-01
|
103.60
|
2020-02-01
|
105.47
|
2020-03-01
|
101.27
|
2020-04-01
|
84.23
|
2020-05-01
|
88.14
|
2020-06-01
|
96.52
|
2020-07-01
|
96.62
|
2020-08-01
|
101.00
|
2020-09-01
|
99.77
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = "Industrial Production: Manufacturing (NAICS)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y="Index 2012=100",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()

Capacity Utilization: Manufacturing (NAICS) (MCUMFN) Monthly. Percent Capacity
symbol <-fredr_series_observations(series_id = "MCUMFN",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
date
|
value
|
2019-01-01
|
77.24
|
2019-02-01
|
76.75
|
2019-03-01
|
76.64
|
2019-04-01
|
75.88
|
2019-05-01
|
75.88
|
2019-06-01
|
76.22
|
2019-07-01
|
75.83
|
2019-08-01
|
76.21
|
2019-09-01
|
75.62
|
2019-10-01
|
75.10
|
2019-11-01
|
75.76
|
2019-12-01
|
75.84
|
2020-01-01
|
75.74
|
2020-02-01
|
75.66
|
2020-03-01
|
71.87
|
2020-04-01
|
60.50
|
2020-05-01
|
62.70
|
2020-06-01
|
67.59
|
2020-07-01
|
70.51
|
2020-08-01
|
71.33
|
2020-09-01
|
71.15
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = "Capacity Utilization: Manufacturing (NAICS)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Percent Capacity",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()

Industrial Production : Crude oil (IPG211111CN) Index 2012=100, monthly
symbol <-fredr_series_observations(series_id = "IPG211111CN",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
date
|
value
|
2019-01-01
|
182.6
|
2019-02-01
|
178.5
|
2019-03-01
|
181.9
|
2019-04-01
|
185.4
|
2019-05-01
|
185.3
|
2019-06-01
|
184.5
|
2019-07-01
|
180.9
|
2019-08-01
|
189.5
|
2019-09-01
|
190.9
|
2019-10-01
|
193.9
|
2019-11-01
|
196.8
|
2019-12-01
|
196.0
|
2020-01-01
|
195.2
|
2020-02-01
|
195.0
|
2020-03-01
|
194.9
|
2020-04-01
|
183.8
|
2020-05-01
|
153.4
|
2020-06-01
|
159.9
|
2020-07-01
|
168.1
|
2020-08-01
|
158.8
|
2020-09-01
|
163.3
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = " Crude oil Production",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y="Index 2012 = 100",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()+
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-07-2020'), ymin = -Inf, ymax = Inf),
fill = "lightblue", alpha = 0.02)

Industrial Production: Durable manufacturing: Motor vehicles and parts (IPG3361T3N) Index 2012=100, monthly
symbol <-fredr_series_observations(series_id = "IPG3361T3N",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
|
date
|
value
|
16
|
2020-04-01
|
21.82
|
17
|
2020-05-01
|
45.26
|
18
|
2020-06-01
|
106.22
|
19
|
2020-07-01
|
109.52
|
20
|
2020-08-01
|
133.67
|
21
|
2020-09-01
|
127.11
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = "Motor vehicles and parts Production",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y="Index 2012=100",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()

Industrial Production: Consumer goods (IPB51000N) Index 2012=100, monthly
symbol <-fredr_series_observations(series_id = "IPB51000N",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
|
date
|
value
|
16
|
2020-04-01
|
84.23
|
17
|
2020-05-01
|
87.31
|
18
|
2020-06-01
|
98.63
|
19
|
2020-07-01
|
101.28
|
20
|
2020-08-01
|
105.70
|
21
|
2020-09-01
|
101.38
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = "Consumer goods Production",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y=" Index 2012=100",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()

Industrial Production: Nondurable manufacturing: Food, beverage, and tobacco (IPG311A2N) Index 2012=100, monthly
symbol <-fredr_series_observations(series_id = "IPG311A2N",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
|
date
|
value
|
16
|
2020-04-01
|
99.71
|
17
|
2020-05-01
|
101.28
|
18
|
2020-06-01
|
108.94
|
19
|
2020-07-01
|
105.76
|
20
|
2020-08-01
|
110.70
|
21
|
2020-09-01
|
110.34
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = "Production of Food, Beverage, and Tobacco",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y=" Index 2012=100",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()

Industrial Production: Durable manufacturing: Aerospace and miscellaneous transportation equipment (IPG3364T9N) Index 2012=100, monthly
symbol <-fredr_series_observations(series_id = "IPG3364T9N",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
|
date
|
value
|
16
|
2020-04-01
|
64.78
|
17
|
2020-05-01
|
72.40
|
18
|
2020-06-01
|
75.26
|
19
|
2020-07-01
|
79.22
|
20
|
2020-08-01
|
82.19
|
21
|
2020-09-01
|
85.95
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = " Industrial Production: Aerospace and miscellaneous transportation equipment",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y=" Index 2012=100",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()

Capacity Utilization: Durable Manufacturing: Automobile and light duty motor vehicle (CAPUTLG33611S) Percent of Capacity, monthly
symbol <-fredr_series_observations(series_id = "CAPUTLG33611S",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
|
date
|
value
|
16
|
2020-04-01
|
0.621
|
17
|
2020-05-01
|
16.320
|
18
|
2020-06-01
|
61.621
|
19
|
2020-07-01
|
93.266
|
20
|
2020-08-01
|
84.650
|
21
|
2020-09-01
|
77.683
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = " Capacity Utilization: Automobile and light duty motor vehicle",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Time", y=" Index 2012=100",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()

### Industrial Capacity: Nondurable Manufacturing: Paper CAPG322S
- Index 2012=100, Monthly, Seasonally Adjusted
symbol <-fredr_series_observations(series_id = "CAPG322S",
observation_start = as.Date("2019-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
|
date
|
value
|
16
|
2020-04-01
|
109.4
|
17
|
2020-05-01
|
109.4
|
18
|
2020-06-01
|
109.3
|
19
|
2020-07-01
|
109.2
|
20
|
2020-08-01
|
109.1
|
21
|
2020-09-01
|
109.0
|
indicator <-as.data.frame(symbol)[,c(1,3)]
indicator %>% ggplot() +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.02)+
geom_line(mapping = aes(x=date,y=value),color="red",size=1) +
labs(title = " Industrial Capacity: Paper Manufacturing (CAPG322S)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Monthly", y=" Index 2012=100",
caption = "Data source: FRED Federal Reserve. Illustration by @JoeLongSanDiego")+
theme_economist()
