Import Price Index (End Use): All commodities (IR)
indicator <-fredr_series_observations(series_id = "IR",
observation_start = as.Date("2000-01-01"))
#indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator[,c(1,3)]) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2, T, color = "red" )
date
|
value
|
2020-04-01
|
118.2
|
2020-05-01
|
119.0
|
2020-06-01
|
120.6
|
2020-07-01
|
122.0
|
2020-08-01
|
123.2
|
2020-09-01
|
123.6
|
indicator %>%
ggplot(aes(x = date, y = value)) +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(color = "dodgerblue4",size=.8) +
labs(
x = "",
y = "Base Index Year 2000 = 100",
title = "Import Price Index (End Use): All commodities (IR)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
theme_economist()

indicator2 <- filter(indicator,date >= "2019-01-01")
indicator2 %>%
ggplot(aes(x = date, y = value)) +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(color = "dodgerblue4",size=.8) +
labs(
x = "Monthly",
y = "Base Index Year 2000 = 100",
title = "Import Price Index (End Use): All commodities (IR) _ Short Term Trend",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
theme_economist()

Export Price Index (End Use): All commodities (IQ)
symbol <-fredr_series_observations(series_id = "IQ",
observation_start = as.Date("2000-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
|
244
|
2020-04-01
|
118.2
|
245
|
2020-05-01
|
118.2
|
246
|
2020-06-01
|
120.3
|
247
|
2020-07-01
|
121.5
|
248
|
2020-08-01
|
122.1
|
249
|
2020-09-01
|
122.8
|
indicator %>%
ggplot(aes(x = date, y = value)) +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(color = "dodgerblue4",size=.8) +
labs(
x = "Monthly",
y = "Base Index Year 2000 = 100",
title = "Export Price Index (End Use): All commodities (IQ)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
theme_economist()

indicator2 <- filter(indicator,date >= "2019-01-01")
indicator2 %>%
ggplot(aes(x = date, y = value)) +
geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-10-2020'), ymin = -Inf, ymax = Inf),
fill = "white", alpha = 0.03)+
geom_line(color = "dodgerblue4",size=.8) +
labs(
x = "Monthly",
y = "Base Index Year 2000 = 100",
title = "Export Price Index (End Use): All commodities (IQ) _ Short Term Trend",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
caption = "Data source: FRED St. Louis Federal Reserve \nIllustration by @JoeLongSanDiego") +
theme_economist()
