class: center, middle, inverse, title-slide # Introduction to gganimate ## Unemployment in Europe ### Luca Picci --- # Getting Started Showing the steps to create an animated bar chart can be tricky. -- In order to demonstrate the steps required to build this animated plot we will: -- - Build the skeleton of the plot (declare aesthetics and build the theme and annotations) -- - Then use facet_wrap() and declare the geoms to show the different bar lengths at each time period -- - Finally we will combine the plots and add the animation --- count: false Data Manipulation .panel1-plotdata-auto[ ```r *unemployment ``` ] .panel2-plotdata-auto[ ``` ## # A tibble: 810 x 5 ## LOCATION Country SUBJECT TIME Value ## <chr> <chr> <chr> <dbl> <dbl> ## 1 AUT Austria TOT 1999 4.97 ## 2 AUT Austria TOT 2000 5.15 ## 3 AUT Austria TOT 2001 5.7 ## 4 AUT Austria TOT 2002 6.18 ## 5 AUT Austria TOT 2003 7.05 ## 6 AUT Austria TOT 2004 10.5 ## 7 AUT Austria TOT 2005 11.0 ## 8 AUT Austria TOT 2006 9.8 ## 9 AUT Austria TOT 2007 9.38 ## 10 AUT Austria TOT 2008 8.48 ## # … with 800 more rows ``` ] --- count: false Data Manipulation .panel1-plotdata-auto[ ```r unemployment %>% * filter(SUBJECT == "TOT") ``` ] .panel2-plotdata-auto[ ``` ## # A tibble: 271 x 5 ## LOCATION Country SUBJECT TIME Value ## <chr> <chr> <chr> <dbl> <dbl> ## 1 AUT Austria TOT 1999 4.97 ## 2 AUT Austria TOT 2000 5.15 ## 3 AUT Austria TOT 2001 5.7 ## 4 AUT Austria TOT 2002 6.18 ## 5 AUT Austria TOT 2003 7.05 ## 6 AUT Austria TOT 2004 10.5 ## 7 AUT Austria TOT 2005 11.0 ## 8 AUT Austria TOT 2006 9.8 ## 9 AUT Austria TOT 2007 9.38 ## 10 AUT Austria TOT 2008 8.48 ## # … with 261 more rows ``` ] --- count: false Data Manipulation .panel1-plotdata-auto[ ```r unemployment %>% filter(SUBJECT == "TOT") %>% * filter(TIME>=2007) ``` ] .panel2-plotdata-auto[ ``` ## # A tibble: 164 x 5 ## LOCATION Country SUBJECT TIME Value ## <chr> <chr> <chr> <dbl> <dbl> ## 1 AUT Austria TOT 2007 9.38 ## 2 AUT Austria TOT 2008 8.48 ## 3 AUT Austria TOT 2009 10.6 ## 4 AUT Austria TOT 2010 9.48 ## 5 AUT Austria TOT 2011 8.95 ## 6 AUT Austria TOT 2012 9.4 ## 7 AUT Austria TOT 2013 9.68 ## 8 AUT Austria TOT 2014 10.3 ## 9 AUT Austria TOT 2015 10.6 ## 10 AUT Austria TOT 2016 11.2 ## # … with 154 more rows ``` ] --- count: false Data Manipulation .panel1-plotdata-auto[ ```r unemployment %>% filter(SUBJECT == "TOT") %>% filter(TIME>=2007) %>% * filter(Country!= "Estonia") ``` ] .panel2-plotdata-auto[ ``` ## # A tibble: 154 x 5 ## LOCATION Country SUBJECT TIME Value ## <chr> <chr> <chr> <dbl> <dbl> ## 1 AUT Austria TOT 2007 9.38 ## 2 AUT Austria TOT 2008 8.48 ## 3 AUT Austria TOT 2009 10.6 ## 4 AUT Austria TOT 2010 9.48 ## 5 AUT Austria TOT 2011 8.95 ## 6 AUT Austria TOT 2012 9.4 ## 7 AUT Austria TOT 2013 9.68 ## 8 AUT Austria TOT 2014 10.3 ## 9 AUT Austria TOT 2015 10.6 ## 10 AUT Austria TOT 2016 11.2 ## # … with 144 more rows ``` ] --- count: false Data Manipulation .panel1-plotdata-auto[ ```r unemployment %>% filter(SUBJECT == "TOT") %>% filter(TIME>=2007) %>% filter(Country!= "Estonia")%>% * select(-LOCATION) ``` ] .panel2-plotdata-auto[ ``` ## # A tibble: 154 x 4 ## Country SUBJECT TIME Value ## <chr> <chr> <dbl> <dbl> ## 1 Austria TOT 2007 9.38 ## 2 Austria TOT 2008 8.48 ## 3 Austria TOT 2009 10.6 ## 4 Austria TOT 2010 9.48 ## 5 Austria TOT 2011 8.95 ## 6 Austria TOT 2012 9.4 ## 7 Austria TOT 2013 9.68 ## 8 Austria TOT 2014 10.3 ## 9 Austria TOT 2015 10.6 ## 10 Austria TOT 2016 11.2 ## # … with 144 more rows ``` ] --- count: false Data Manipulation .panel1-plotdata-auto[ ```r unemployment %>% filter(SUBJECT == "TOT") %>% filter(TIME>=2007) %>% filter(Country!= "Estonia")%>% select(-LOCATION) %>% * select(-SUBJECT) ``` ] .panel2-plotdata-auto[ ``` ## # A tibble: 154 x 3 ## Country TIME Value ## <chr> <dbl> <dbl> ## 1 Austria 2007 9.38 ## 2 Austria 2008 8.48 ## 3 Austria 2009 10.6 ## 4 Austria 2010 9.48 ## 5 Austria 2011 8.95 ## 6 Austria 2012 9.4 ## 7 Austria 2013 9.68 ## 8 Austria 2014 10.3 ## 9 Austria 2015 10.6 ## 10 Austria 2016 11.2 ## # … with 144 more rows ``` ] --- count: false Data Manipulation .panel1-plotdata-auto[ ```r unemployment %>% filter(SUBJECT == "TOT") %>% filter(TIME>=2007) %>% filter(Country!= "Estonia")%>% select(-LOCATION) %>% select(-SUBJECT) -> * plotdata ``` ] .panel2-plotdata-auto[ ] <style> .panel1-plotdata-auto { color: black; width: 38.6060606060606%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel2-plotdata-auto { color: black; width: 59.3939393939394%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel3-plotdata-auto { color: black; width: NA%; hight: 33%; float: left; padding-left: 1%; font-size: 80% } </style> --- count: false Building the Plot .panel1-plot1-auto[ ```r *ggplot(data = plotdata) ``` ] .panel2-plot1-auto[ data:image/s3,"s3://crabby-images/1304c/1304c2d7e33554d0fc23c288f687ae18c01a91a5" alt=""<!-- --> ] --- count: false Building the Plot .panel1-plot1-auto[ ```r ggplot(data = plotdata) + * aes(y = reorder(Country, Value)) ``` ] .panel2-plot1-auto[ data:image/s3,"s3://crabby-images/af3e2/af3e2790ec2dfd17a161a94e3becb1872a3bae69" alt=""<!-- --> ] --- count: false Building the Plot .panel1-plot1-auto[ ```r ggplot(data = plotdata) + aes(y = reorder(Country, Value))+ * aes(x = Value) ``` ] .panel2-plot1-auto[ data:image/s3,"s3://crabby-images/85a28/85a2883218024787953c8d9ad203498147c43434" alt=""<!-- --> ] --- count: false Building the Plot .panel1-plot1-auto[ ```r ggplot(data = plotdata) + aes(y = reorder(Country, Value))+ aes(x = Value)+ * geom_segment(aes(x = 0, xend = 65, * yend = Country), * size = 7.5, * color = "azure3") ``` ] .panel2-plot1-auto[ data:image/s3,"s3://crabby-images/94220/94220b2efd095b223517509afed839db9109a45a" alt=""<!-- --> ] --- count: false Building the Plot .panel1-plot1-auto[ ```r ggplot(data = plotdata) + aes(y = reorder(Country, Value))+ aes(x = Value)+ geom_segment(aes(x = 0, xend = 65, yend = Country), size = 7.5, color = "azure3")+ * scale_x_continuous(position = "top", * breaks = c(0, 25, 50), * labels= * function(x) paste0(x,"%")) ``` ] .panel2-plot1-auto[ data:image/s3,"s3://crabby-images/07dc8/07dc80ee8f4c0b5fbb54e5990f75dc7200bf9d4e" alt=""<!-- --> ] --- count: false Building the Plot .panel1-plot1-auto[ ```r ggplot(data = plotdata) + aes(y = reorder(Country, Value))+ aes(x = Value)+ geom_segment(aes(x = 0, xend = 65, yend = Country), size = 7.5, color = "azure3")+ scale_x_continuous(position = "top", breaks = c(0, 25, 50), labels= function(x) paste0(x,"%"))+ * labs(title = "Euro Area Youth Unemployment Rate 2007 - 2017") ``` ] .panel2-plot1-auto[ data:image/s3,"s3://crabby-images/eb2ba/eb2ba7f6f702b9412958ecfd7d1fc8ff4cc4531a" alt=""<!-- --> ] --- count: false Building the Plot .panel1-plot1-auto[ ```r ggplot(data = plotdata) + aes(y = reorder(Country, Value))+ aes(x = Value)+ geom_segment(aes(x = 0, xend = 65, yend = Country), size = 7.5, color = "azure3")+ scale_x_continuous(position = "top", breaks = c(0, 25, 50), labels= function(x) paste0(x,"%"))+ labs(title = "Euro Area Youth Unemployment Rate 2007 - 2017")+ * labs(subtitle = "Youth unemployment (15-24 years) expressed as a percent of the youth labour force") ``` ] .panel2-plot1-auto[ data:image/s3,"s3://crabby-images/ea32f/ea32f3f7e855521ca26ad20f1083ac03443788e3" alt=""<!-- --> ] --- count: false Building the Plot .panel1-plot1-auto[ ```r ggplot(data = plotdata) + aes(y = reorder(Country, Value))+ aes(x = Value)+ geom_segment(aes(x = 0, xend = 65, yend = Country), size = 7.5, color = "azure3")+ scale_x_continuous(position = "top", breaks = c(0, 25, 50), labels= function(x) paste0(x,"%"))+ labs(title = "Euro Area Youth Unemployment Rate 2007 - 2017")+ labs(subtitle = "Youth unemployment (15-24 years) expressed as a percent of the youth labour force")+ * labs(y = NULL) ``` ] .panel2-plot1-auto[ data:image/s3,"s3://crabby-images/cd159/cd15937bf526b277ff0436903671c8e8059f4e5f" alt=""<!-- --> ] --- count: false Building the Plot .panel1-plot1-auto[ ```r ggplot(data = plotdata) + aes(y = reorder(Country, Value))+ aes(x = Value)+ geom_segment(aes(x = 0, xend = 65, yend = Country), size = 7.5, color = "azure3")+ scale_x_continuous(position = "top", breaks = c(0, 25, 50), labels= function(x) paste0(x,"%"))+ labs(title = "Euro Area Youth Unemployment Rate 2007 - 2017")+ labs(subtitle = "Youth unemployment (15-24 years) expressed as a percent of the youth labour force")+ labs(y = NULL)+ * labs(caption = "*excl. Malta, Cyprus, Estonia\nSource:OECD (2020), Youth unemployment rate (indicator)") ``` ] .panel2-plot1-auto[ data:image/s3,"s3://crabby-images/fbc13/fbc13c769915fb396841d6b2231871668fce48cc" alt=""<!-- --> ] --- count: false Building the Plot .panel1-plot1-auto[ ```r ggplot(data = plotdata) + aes(y = reorder(Country, Value))+ aes(x = Value)+ geom_segment(aes(x = 0, xend = 65, yend = Country), size = 7.5, color = "azure3")+ scale_x_continuous(position = "top", breaks = c(0, 25, 50), labels= function(x) paste0(x,"%"))+ labs(title = "Euro Area Youth Unemployment Rate 2007 - 2017")+ labs(subtitle = "Youth unemployment (15-24 years) expressed as a percent of the youth labour force")+ labs(y = NULL)+ labs(caption = "*excl. Malta, Cyprus, Estonia\nSource:OECD (2020), Youth unemployment rate (indicator)")-> * plot ``` ] .panel2-plot1-auto[ ] --- count: false Building the Plot .panel1-plot1-auto[ ```r ggplot(data = plotdata) + aes(y = reorder(Country, Value))+ aes(x = Value)+ geom_segment(aes(x = 0, xend = 65, yend = Country), size = 7.5, color = "azure3")+ scale_x_continuous(position = "top", breaks = c(0, 25, 50), labels= function(x) paste0(x,"%"))+ labs(title = "Euro Area Youth Unemployment Rate 2007 - 2017")+ labs(subtitle = "Youth unemployment (15-24 years) expressed as a percent of the youth labour force")+ labs(y = NULL)+ labs(caption = "*excl. Malta, Cyprus, Estonia\nSource:OECD (2020), Youth unemployment rate (indicator)")-> plot ``` ] .panel2-plot1-auto[ ] <style> .panel1-plot1-auto { color: black; width: 38.6060606060606%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel2-plot1-auto { color: black; width: 59.3939393939394%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel3-plot1-auto { color: black; width: NA%; hight: 33%; float: left; padding-left: 1%; font-size: 80% } </style> --- count: false Building the Theme .panel1-plot2-auto[ ```r *plot ``` ] .panel2-plot2-auto[ data:image/s3,"s3://crabby-images/32aa9/32aa96f7f29bfbc2eafac9aa4f475e0d1d904f3c" alt=""<!-- --> ] --- count: false Building the Theme .panel1-plot2-auto[ ```r plot+ * theme(panel.background = * element_rect(fill = "grey99")) ``` ] .panel2-plot2-auto[ data:image/s3,"s3://crabby-images/b5f5d/b5f5d0b4f9b4a66c69852d56a8e5c29d7e444c5c" alt=""<!-- --> ] --- count: false Building the Theme .panel1-plot2-auto[ ```r plot+ theme(panel.background = element_rect(fill = "grey99"))+ * theme(plot.background = * element_rect(fill = "grey99")) ``` ] .panel2-plot2-auto[ data:image/s3,"s3://crabby-images/bd4c9/bd4c98cbe35c2894accecdb1a21c92c70df94094" alt=""<!-- --> ] --- count: false Building the Theme .panel1-plot2-auto[ ```r plot+ theme(panel.background = element_rect(fill = "grey99"))+ theme(plot.background = element_rect(fill = "grey99"))+ * theme(panel.grid = element_blank()) ``` ] .panel2-plot2-auto[ data:image/s3,"s3://crabby-images/61444/6144485c57c24b017323403e082e4c21e1ecde07" alt=""<!-- --> ] --- count: false Building the Theme .panel1-plot2-auto[ ```r plot+ theme(panel.background = element_rect(fill = "grey99"))+ theme(plot.background = element_rect(fill = "grey99"))+ theme(panel.grid = element_blank())+ * theme(plot.title = * element_text(size = 18, hjust = 0, * color = "steelblue4", * face = "bold")) ``` ] .panel2-plot2-auto[ data:image/s3,"s3://crabby-images/c33da/c33da0485937fb0228093145a0e0570698d7067a" alt=""<!-- --> ] --- count: false Building the Theme .panel1-plot2-auto[ ```r plot+ theme(panel.background = element_rect(fill = "grey99"))+ theme(plot.background = element_rect(fill = "grey99"))+ theme(panel.grid = element_blank())+ theme(plot.title = element_text(size = 18, hjust = 0, color = "steelblue4", face = "bold"))+ * theme(plot.subtitle = * element_text(size = 12, * color = "darkgoldenrod2", * hjust = 0, face = "bold")) ``` ] .panel2-plot2-auto[ data:image/s3,"s3://crabby-images/a0fbc/a0fbcadba9dcc29c4d3882f97858df38d7e6dc59" alt=""<!-- --> ] --- count: false Building the Theme .panel1-plot2-auto[ ```r plot+ theme(panel.background = element_rect(fill = "grey99"))+ theme(plot.background = element_rect(fill = "grey99"))+ theme(panel.grid = element_blank())+ theme(plot.title = element_text(size = 18, hjust = 0, color = "steelblue4", face = "bold"))+ theme(plot.subtitle = element_text(size = 12, color = "darkgoldenrod2", hjust = 0, face = "bold"))+ * theme(plot.caption = * element_text(color = "steelblue4", * hjust = 0.94)) ``` ] .panel2-plot2-auto[ data:image/s3,"s3://crabby-images/7d89d/7d89ddad543e941facf11210e37fc983db85310b" alt=""<!-- --> ] --- count: false Building the Theme .panel1-plot2-auto[ ```r plot+ theme(panel.background = element_rect(fill = "grey99"))+ theme(plot.background = element_rect(fill = "grey99"))+ theme(panel.grid = element_blank())+ theme(plot.title = element_text(size = 18, hjust = 0, color = "steelblue4", face = "bold"))+ theme(plot.subtitle = element_text(size = 12, color = "darkgoldenrod2", hjust = 0, face = "bold"))+ theme(plot.caption = element_text(color = "steelblue4", hjust = 0.94))+ * theme(axis.title.x = * element_text(size = 12, hjust = 0, * color = "steelblue4", * face = "bold")) ``` ] .panel2-plot2-auto[ data:image/s3,"s3://crabby-images/17871/17871744f52f0f9b2571bcc668adf8661bd8adc3" alt=""<!-- --> ] --- count: false Building the Theme .panel1-plot2-auto[ ```r plot+ theme(panel.background = element_rect(fill = "grey99"))+ theme(plot.background = element_rect(fill = "grey99"))+ theme(panel.grid = element_blank())+ theme(plot.title = element_text(size = 18, hjust = 0, color = "steelblue4", face = "bold"))+ theme(plot.subtitle = element_text(size = 12, color = "darkgoldenrod2", hjust = 0, face = "bold"))+ theme(plot.caption = element_text(color = "steelblue4", hjust = 0.94))+ theme(axis.title.x = element_text(size = 12, hjust = 0, color = "steelblue4", face = "bold"))+ * theme(axis.text.x = * element_text(size = 10, * color = "steelblue4", * hjust = 0.5)) ``` ] .panel2-plot2-auto[ data:image/s3,"s3://crabby-images/5ff77/5ff774b87dd4507bd9c8a8cc49d50973701d5658" alt=""<!-- --> ] --- count: false Building the Theme .panel1-plot2-auto[ ```r plot+ theme(panel.background = element_rect(fill = "grey99"))+ theme(plot.background = element_rect(fill = "grey99"))+ theme(panel.grid = element_blank())+ theme(plot.title = element_text(size = 18, hjust = 0, color = "steelblue4", face = "bold"))+ theme(plot.subtitle = element_text(size = 12, color = "darkgoldenrod2", hjust = 0, face = "bold"))+ theme(plot.caption = element_text(color = "steelblue4", hjust = 0.94))+ theme(axis.title.x = element_text(size = 12, hjust = 0, color = "steelblue4", face = "bold"))+ theme(axis.text.x = element_text(size = 10, color = "steelblue4", hjust = 0.5))+ * theme( * axis.line.y = element_blank(), * axis.text.y = element_blank(), * axis.ticks.y= element_blank(), * axis.ticks.x = element_blank(), * axis.line.x = element_blank()) ``` ] .panel2-plot2-auto[ data:image/s3,"s3://crabby-images/76b2a/76b2ad60e89651b9a7b8aafa9d23b4d5caa5f46c" alt=""<!-- --> ] --- count: false Building the Theme .panel1-plot2-auto[ ```r plot+ theme(panel.background = element_rect(fill = "grey99"))+ theme(plot.background = element_rect(fill = "grey99"))+ theme(panel.grid = element_blank())+ theme(plot.title = element_text(size = 18, hjust = 0, color = "steelblue4", face = "bold"))+ theme(plot.subtitle = element_text(size = 12, color = "darkgoldenrod2", hjust = 0, face = "bold"))+ theme(plot.caption = element_text(color = "steelblue4", hjust = 0.94))+ theme(axis.title.x = element_text(size = 12, hjust = 0, color = "steelblue4", face = "bold"))+ theme(axis.text.x = element_text(size = 10, color = "steelblue4", hjust = 0.5))+ theme( axis.line.y = element_blank(), axis.text.y = element_blank(), axis.ticks.y= element_blank(), axis.ticks.x = element_blank(), axis.line.x = element_blank())-> * plot2 ``` ] .panel2-plot2-auto[ ] <style> .panel1-plot2-auto { color: black; width: 38.6060606060606%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel2-plot2-auto { color: black; width: 59.3939393939394%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel3-plot2-auto { color: black; width: NA%; hight: 33%; float: left; padding-left: 1%; font-size: 80% } </style> --- # Faceting This intermediate step is not necessary, but in order to demostrate clearly how the plot will be built, we will facet by year using facet_wrap() to create an individual plot for each year. This will allow us to see how the bar lengths vary and add annotations before adding animations --- count: false Faceting .panel1-plot3-auto[ ```r *plot2 ``` ] .panel2-plot3-auto[ data:image/s3,"s3://crabby-images/d03e7/d03e733ea63f0052681f70712703ae4bd9286fed" alt=""<!-- --> ] --- count: false Faceting .panel1-plot3-auto[ ```r plot2+ * facet_wrap(~ TIME, nrow=3) ``` ] .panel2-plot3-auto[ data:image/s3,"s3://crabby-images/31282/312827f3700f586eb9cb52c8e80cd78529061bef" alt=""<!-- --> ] --- count: false Faceting .panel1-plot3-auto[ ```r plot2+ facet_wrap(~ TIME, nrow=3)+ * geom_col(fill = "steelblue4", * width = 0.75, * alpha = 0.9) ``` ] .panel2-plot3-auto[ data:image/s3,"s3://crabby-images/e7d2a/e7d2a5f4963b0a18be5df9938422f2c6d1aabf9f" alt=""<!-- --> ] --- count: false Faceting .panel1-plot3-auto[ ```r plot2+ facet_wrap(~ TIME, nrow=3)+ geom_col(fill = "steelblue4", width = 0.75, alpha = 0.9)+ * annotate(x=0, xend=65, * y=15, yend=15, * colour="steelblue4", * geom="segment", * size = 2) ``` ] .panel2-plot3-auto[ data:image/s3,"s3://crabby-images/bd70f/bd70f22659c3fd719311d321cf00594e0a250b1b" alt=""<!-- --> ] --- count: false Faceting .panel1-plot3-auto[ ```r plot2+ facet_wrap(~ TIME, nrow=3)+ geom_col(fill = "steelblue4", width = 0.75, alpha = 0.9)+ annotate(x=0, xend=65, y=15, yend=15, colour="steelblue4", geom="segment", size = 2)+ * annotate(x = 25, xend = 25, * y = 14.9, yend = 0.5, * size = 1, geom="segment", * color = "darkgoldenrod2", * linetype = "dashed") ``` ] .panel2-plot3-auto[ data:image/s3,"s3://crabby-images/fe5bb/fe5bb17028ac600223d35225d0290d0fabed05be" alt=""<!-- --> ] --- count: false Faceting .panel1-plot3-auto[ ```r plot2+ facet_wrap(~ TIME, nrow=3)+ geom_col(fill = "steelblue4", width = 0.75, alpha = 0.9)+ annotate(x=0, xend=65, y=15, yend=15, colour="steelblue4", geom="segment", size = 2)+ annotate(x = 25, xend = 25, y = 14.9, yend = 0.5, size = 1, geom="segment", color = "darkgoldenrod2", linetype = "dashed")+ * annotate(x = 50, xend = 50, * y = 14.9, yend = 0.5, * size = 1, geom="segment", * color = "darkgoldenrod2", * linetype = "dashed") ``` ] .panel2-plot3-auto[ data:image/s3,"s3://crabby-images/88ffc/88ffc656804f3d556eb67af8ee62e4a42f99a639" alt=""<!-- --> ] --- count: false Faceting .panel1-plot3-auto[ ```r plot2+ facet_wrap(~ TIME, nrow=3)+ geom_col(fill = "steelblue4", width = 0.75, alpha = 0.9)+ annotate(x=0, xend=65, y=15, yend=15, colour="steelblue4", geom="segment", size = 2)+ annotate(x = 25, xend = 25, y = 14.9, yend = 0.5, size = 1, geom="segment", color = "darkgoldenrod2", linetype = "dashed")+ annotate(x = 50, xend = 50, y = 14.9, yend = 0.5, size = 1, geom="segment", color = "darkgoldenrod2", linetype = "dashed")-> * plot3 ``` ] .panel2-plot3-auto[ ] <style> .panel1-plot3-auto { color: black; width: 38.6060606060606%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel2-plot3-auto { color: black; width: 59.3939393939394%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel3-plot3-auto { color: black; width: NA%; hight: 33%; float: left; padding-left: 1%; font-size: 80% } </style> --- count: false Adding the Animation .panel1-plot4-user[ ```r *plot3 ``` ] .panel2-plot4-user[ data:image/s3,"s3://crabby-images/1bb75/1bb750456f78bb6584e7307df285895d516fbb0a" alt=""<!-- --> ] --- count: false Adding the Animation .panel1-plot4-user[ ```r plot3+ * facet_null()+ * gganimate::transition_time(TIME) ``` ] .panel2-plot4-user[ data:image/s3,"s3://crabby-images/31383/31383731b73452a31bf257bbbc61856e6ce96815" alt=""<!-- --> ] --- count: false Adding the Animation .panel1-plot4-user[ ```r plot3+ facet_null()+ gganimate::transition_time(TIME)+ * ease_aes('linear') ``` ] .panel2-plot4-user[ data:image/s3,"s3://crabby-images/188f8/188f819bef002be3b7e2bba82ef0daa958e47019" alt=""<!-- --> ] --- count: false Adding the Animation .panel1-plot4-user[ ```r plot3+ facet_null()+ gganimate::transition_time(TIME)+ ease_aes('linear')+ * labs(x = 'Year: {format(round(frame_time, digits = 0))}')+ * geom_text(aes(label = reorder(Country, Value)), * x = 0.1, hjust = 0, color = "grey99", * fontface = "bold") ``` ] .panel2-plot4-user[ data:image/s3,"s3://crabby-images/c90d3/c90d309ae1d4c1ed9dbc958935f75ebf3f067e78" alt=""<!-- --> ] --- count: false Adding the Animation .panel1-plot4-user[ ```r plot3+ facet_null()+ gganimate::transition_time(TIME)+ ease_aes('linear')+ labs(x = 'Year: {format(round(frame_time, digits = 0))}')+ geom_text(aes(label = reorder(Country, Value)), x = 0.1, hjust = 0, color = "grey99", fontface = "bold")+ * geom_text(aes(label = * format(round(Value, digits = 0))), * x = 63, color = "steelblue4", * fontface = "bold", hjust = 1) ``` ] .panel2-plot4-user[ data:image/s3,"s3://crabby-images/91f56/91f564426cd88e4783fc7775df7268710184373a" alt=""<!-- --> ] --- count: false Adding the Animation .panel1-plot4-user[ ```r plot3+ facet_null()+ gganimate::transition_time(TIME)+ ease_aes('linear')+ labs(x = 'Year: {format(round(frame_time, digits = 0))}')+ geom_text(aes(label = reorder(Country, Value)), x = 0.1, hjust = 0, color = "grey99", fontface = "bold")+ geom_text(aes(label = format(round(Value, digits = 0))), x = 63, color = "steelblue4", fontface = "bold", hjust = 1)+ * geom_text(x=63.5, label = "%", color = "steelblue4", * fontface = "bold", hjust = 0) ``` ] .panel2-plot4-user[ data:image/s3,"s3://crabby-images/68c9f/68c9f83766da71eca89279fb806c0286d511da63" alt=""<!-- --> ] --- count: false Adding the Animation .panel1-plot4-user[ ```r plot3+ facet_null()+ gganimate::transition_time(TIME)+ ease_aes('linear')+ labs(x = 'Year: {format(round(frame_time, digits = 0))}')+ geom_text(aes(label = reorder(Country, Value)), x = 0.1, hjust = 0, color = "grey99", fontface = "bold")+ geom_text(aes(label = format(round(Value, digits = 0))), x = 63, color = "steelblue4", fontface = "bold", hjust = 1)+ geom_text(x=63.5, label = "%", color = "steelblue4", fontface = "bold", hjust = 0)-> * finalplot ``` ] .panel2-plot4-user[ ] <style> .panel1-plot4-user { color: black; width: 45.8723404255319%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel2-plot4-user { color: black; width: 52.1276595744681%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel3-plot4-user { color: black; width: NA%; hight: 33%; float: left; padding-left: 1%; font-size: 80% } </style> --- count: false data:image/s3,"s3://crabby-images/98072/98072ebe1dca01a0f157c6b01b6f9369398b5c6b" alt=""<!-- --> --- count: false data:image/s3,"s3://crabby-images/5ba52/5ba52a98fcf8eb95c0f559885eb66c223fd6ebed" alt=""<!-- --> <style> .panel1-finplot-auto { color: black; width: 99%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel2-finplot-auto { color: black; width: NA%; hight: 32%; float: left; padding-left: 1%; font-size: 80% } .panel3-finplot-auto { color: black; width: NA%; hight: 33%; float: left; padding-left: 1%; font-size: 80% } </style> <style type="text/css"> .remark-code{line-height: 1.2; font-size: 73%} @media print { .has-continuation { display: block; } } </style>