Gross Domestic Product for France (CPMNACNSAB1GQFR)
symbol <-fredr_series_observations(series_id = "CPMNACNSAB1GQFR",
observation_start = as.Date("2010-01-01"))
## Request failed [504]. Retrying in 1.7 seconds...
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator,n=12) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2:3, T, color = "red" )
|
date
|
value
|
32
|
2017-10-01
|
594149
|
33
|
2018-01-01
|
582603
|
34
|
2018-04-01
|
587973
|
35
|
2018-07-01
|
579338
|
36
|
2018-10-01
|
610773
|
37
|
2019-01-01
|
597798
|
38
|
2019-04-01
|
606615
|
39
|
2019-07-01
|
597786
|
40
|
2019-10-01
|
623510
|
41
|
2020-01-01
|
578667
|
42
|
2020-04-01
|
512016
|
43
|
2020-07-01
|
575174
|
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 = "Gross Domestic Product for France (CPMNACNSAB1GQFR) ",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Quartely, Not Seasonally Adjusted", y="Millions of Euros",
caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
theme_economist()

Gross Domestic Product for United Kingdom (CPMNACNSAB1GQUK)
symbol <-fredr_series_observations(series_id = "CPMNACNSAB1GQUK",
observation_start = as.Date("2010-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator,n=12) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2:3, T, color = "red" )
|
date
|
value
|
31
|
2017-07-01
|
513830
|
32
|
2017-10-01
|
529053
|
33
|
2018-01-01
|
528688
|
34
|
2018-04-01
|
530063
|
35
|
2018-07-01
|
534823
|
36
|
2018-10-01
|
548218
|
37
|
2019-01-01
|
551736
|
38
|
2019-04-01
|
546179
|
39
|
2019-07-01
|
552905
|
40
|
2019-10-01
|
563542
|
41
|
2020-01-01
|
555298
|
42
|
2020-04-01
|
472173
|
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 = "Gross Domestic Product for United Kingdom (CPMNACNSAB1GQUK) ",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Quartely, Not Seasonally Adjusted", y="Millions of Euros",
caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
theme_economist()

Gross Domestic Product for Germany (CLVMNACNSAB1GQDE)
symbol <-fredr_series_observations(series_id = "CPMNACNSAB1GQDE",
observation_start = as.Date("2010-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator,n=12) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2:3, T, color = "red" )
|
date
|
value
|
32
|
2017-10-01
|
841990
|
33
|
2018-01-01
|
821150
|
34
|
2018-04-01
|
831070
|
35
|
2018-07-01
|
839800
|
36
|
2018-10-01
|
864390
|
37
|
2019-01-01
|
845820
|
38
|
2019-04-01
|
846940
|
39
|
2019-07-01
|
870150
|
40
|
2019-10-01
|
886140
|
41
|
2020-01-01
|
851810
|
42
|
2020-04-01
|
768770
|
43
|
2020-07-01
|
843370
|
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 = "Gross Domestic Product for Germany (CLVMNACNSAB1GQDE) ",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Quartely, Not Seasonally Adjusted", y="Millions of Euros",
caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
theme_economist()

Gross Domestic Product for Spain (CLVMNACNSAB1GQES)
symbol <-fredr_series_observations(series_id = "CPMNACNSAB1GQES",
observation_start = as.Date("2010-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator,n=12) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2:3, T, color = "red" )
|
date
|
value
|
32
|
2017-10-01
|
303707
|
33
|
2018-01-01
|
286806
|
34
|
2018-04-01
|
305083
|
35
|
2018-07-01
|
297131
|
36
|
2018-10-01
|
315221
|
37
|
2019-01-01
|
298529
|
38
|
2019-04-01
|
315695
|
39
|
2019-07-01
|
305647
|
40
|
2019-10-01
|
324901
|
41
|
2020-01-01
|
290641
|
42
|
2020-04-01
|
250559
|
43
|
2020-07-01
|
280342
|
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 = "Gross Domestic Product for Spain (CLVMNACNSAB1GQES) ",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Quartely, Not Seasonally Adjusted", y="Millions of Euros",
caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
theme_economist()

Gross Domestic Product for Italy (CPMNACNSAB1GQIT)
symbol <-fredr_series_observations(series_id = "CPMNACNSAB1GQIT",
observation_start = as.Date("2010-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator,n=12) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2:3, T, color = "red" )
|
date
|
value
|
31
|
2017-07-01
|
430710
|
32
|
2017-10-01
|
462161
|
33
|
2018-01-01
|
422815
|
34
|
2018-04-01
|
442646
|
35
|
2018-07-01
|
437268
|
36
|
2018-10-01
|
468334
|
37
|
2019-01-01
|
427820
|
38
|
2019-04-01
|
444395
|
39
|
2019-07-01
|
443526
|
40
|
2019-10-01
|
474005
|
41
|
2020-01-01
|
406915
|
42
|
2020-04-01
|
370052
|
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 = "Gross Domestic Product for Italy (CPMNACNSAB1GQIT) ",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Quartely, Not Seasonally Adjusted", y="Millions of Euros",
caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
theme_economist()

Gross Domestic Product for Norway (CLVMNACNSAB1GQNO)
symbol <-fredr_series_observations(series_id = "CPMNACNSAB1GQNO",
observation_start = as.Date("2010-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator,n=12) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2:3, T, color = "red" )
|
date
|
value
|
31
|
2017-07-01
|
792070
|
32
|
2017-10-01
|
867510
|
33
|
2018-01-01
|
862893
|
34
|
2018-04-01
|
875293
|
35
|
2018-07-01
|
862446
|
36
|
2018-10-01
|
930228
|
37
|
2019-01-01
|
902367
|
38
|
2019-04-01
|
868386
|
39
|
2019-07-01
|
848582
|
40
|
2019-10-01
|
930025
|
41
|
2020-01-01
|
899181
|
42
|
2020-04-01
|
799964
|
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 = "Gross Domestic Product for Norway (CLVMNACNSAB1GQNO) ",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Quartely, Not Seasonally Adjusted", y="Millions of Euros",
caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
theme_economist()

Gross Domestic Product for Sweden (CLVMNACNSAB1GQSE)
symbol <-fredr_series_observations(series_id = "CPMNACNSAB1GQSE",
observation_start = as.Date("2010-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator,n=12) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2:3, T, color = "red" )
|
date
|
value
|
31
|
2017-07-01
|
1107745
|
32
|
2017-10-01
|
1223053
|
33
|
2018-01-01
|
1157617
|
34
|
2018-04-01
|
1248970
|
35
|
2018-07-01
|
1147467
|
36
|
2018-10-01
|
1274252
|
37
|
2019-01-01
|
1209089
|
38
|
2019-04-01
|
1291156
|
39
|
2019-07-01
|
1206073
|
40
|
2019-10-01
|
1314967
|
41
|
2020-01-01
|
1239914
|
42
|
2020-04-01
|
1217111
|
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 = "Gross Domestic Product for Sweden (CLVMNACNSAB1GQSE)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Quartely, Not Seasonally Adjusted", y="Millions of Euros",
caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
theme_economist()

Gross Domestic Product for Greece (CPMNACNSAB1GQEL)
symbol <-fredr_series_observations(series_id = "CPMNACNSAB1GQEL",
observation_start = as.Date("2010-01-01"))
indicator <-as.data.frame(symbol)[,c(1,3)]
tail(indicator,n=12) %>% kable() %>%
kable_styling(bootstrap_options = c("striped", "hover", "condensed")) %>%
column_spec(2:3, T, color = "red" )
|
date
|
value
|
31
|
2017-07-01
|
48498
|
32
|
2017-10-01
|
45483
|
33
|
2018-01-01
|
41926
|
34
|
2018-04-01
|
46287
|
35
|
2018-07-01
|
50074
|
36
|
2018-10-01
|
46427
|
37
|
2019-01-01
|
42592
|
38
|
2019-04-01
|
47787
|
39
|
2019-07-01
|
50925
|
40
|
2019-10-01
|
46153
|
41
|
2020-01-01
|
41424
|
42
|
2020-04-01
|
39610
|
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 = "Gross Domestic Product for Greece (CPMNACNSAB1GQEL)",
subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
x="Quartely, Not Seasonally Adjusted", y="Millions of Euros",
caption = "Data source: FRED St. Louis Federal Reserve\nIllustration by @JoeLongSanDiego")+
theme_economist()
