Data PreProcessing

library(tidyverse)
## -- Attaching packages ------------------------------------------- tidyverse 1.3.0 --
## v ggplot2 3.3.2     v purrr   0.3.4
## v tibble  3.0.3     v dplyr   1.0.1
## v tidyr   1.1.1     v stringr 1.4.0
## v readr   1.3.1     v forcats 0.5.0
## -- Conflicts ---------------------------------------------- tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
library(janitor)
## 
## Attaching package: 'janitor'
## The following objects are masked from 'package:stats':
## 
##     chisq.test, fisher.test
gdp <- read_csv("GDP_Data.csv")
## Parsed with column specification:
## cols(
##   `Series Name` = col_character(),
##   `Series Code` = col_character(),
##   `Country Name` = col_character(),
##   `Country Code` = col_character(),
##   `1990 [YR1990]` = col_character(),
##   `2000 [YR2000]` = col_character(),
##   `2009 [YR2009]` = col_character(),
##   `2010 [YR2010]` = col_character(),
##   `2011 [YR2011]` = col_character(),
##   `2012 [YR2012]` = col_character(),
##   `2013 [YR2013]` = col_character(),
##   `2014 [YR2014]` = col_character(),
##   `2015 [YR2015]` = col_character(),
##   `2016 [YR2016]` = col_character(),
##   `2017 [YR2017]` = col_character(),
##   `2018 [YR2018]` = col_character()
## )
gdp <- gdp %>% select(3:15) 

gdp <- gdp[1:217,]
gdp_tidy <- gdp %>% 
  mutate_at(vars(contains("YR")),as.numeric) %>% 
  gather(year,value,3:13) %>% 
  janitor::clean_names() %>% 
  mutate(year = as.numeric(stringr::str_sub(year,1,4)))
## Warning: Problem with `mutate()` input `1990 [YR1990]`.
## x NAs introduced by coercion
## i Input `1990 [YR1990]` is `.Primitive("as.double")(`1990 [YR1990]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
## Warning: Problem with `mutate()` input `2000 [YR2000]`.
## x NAs introduced by coercion
## i Input `2000 [YR2000]` is `.Primitive("as.double")(`2000 [YR2000]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
## Warning: Problem with `mutate()` input `2009 [YR2009]`.
## x NAs introduced by coercion
## i Input `2009 [YR2009]` is `.Primitive("as.double")(`2009 [YR2009]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
## Warning: Problem with `mutate()` input `2010 [YR2010]`.
## x NAs introduced by coercion
## i Input `2010 [YR2010]` is `.Primitive("as.double")(`2010 [YR2010]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
## Warning: Problem with `mutate()` input `2011 [YR2011]`.
## x NAs introduced by coercion
## i Input `2011 [YR2011]` is `.Primitive("as.double")(`2011 [YR2011]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
## Warning: Problem with `mutate()` input `2012 [YR2012]`.
## x NAs introduced by coercion
## i Input `2012 [YR2012]` is `.Primitive("as.double")(`2012 [YR2012]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
## Warning: Problem with `mutate()` input `2013 [YR2013]`.
## x NAs introduced by coercion
## i Input `2013 [YR2013]` is `.Primitive("as.double")(`2013 [YR2013]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
## Warning: Problem with `mutate()` input `2014 [YR2014]`.
## x NAs introduced by coercion
## i Input `2014 [YR2014]` is `.Primitive("as.double")(`2014 [YR2014]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
## Warning: Problem with `mutate()` input `2015 [YR2015]`.
## x NAs introduced by coercion
## i Input `2015 [YR2015]` is `.Primitive("as.double")(`2015 [YR2015]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
## Warning: Problem with `mutate()` input `2016 [YR2016]`.
## x NAs introduced by coercion
## i Input `2016 [YR2016]` is `.Primitive("as.double")(`2016 [YR2016]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
## Warning: Problem with `mutate()` input `2017 [YR2017]`.
## x NAs introduced by coercion
## i Input `2017 [YR2017]` is `.Primitive("as.double")(`2017 [YR2017]`)`.
## Warning in mask$eval_all_mutate(dots[[i]]): NAs introduced by coercion
write_csv(gdp_tidy,"gdp_tidy.csv")

Animated Plot and Data Manipulation

An Animated Plot building process involves two primary sections: Building the entire set of actual static plots using ggplot2 Animating the static plots with desired parameters using gganimate

library(tidyverse)
library(gganimate)
gdp_tidy <- read_csv("gdp_tidy.csv")
## Parsed with column specification:
## cols(
##   country_name = col_character(),
##   country_code = col_character(),
##   year = col_double(),
##   value = col_double()
## )
gdp_formatted <- gdp_tidy %>%
  group_by(year) %>%

  mutate(rank = rank(-value),
         Value_rel = value/value[rank==1],
         Value_lbl = paste0(" ",round(value/1e9))) %>%
  group_by(country_name) %>% 
  filter(rank <=10) %>%
  ungroup()

Building Static Plots

As you might have seen in the animation at the top of this post, We’re going to see how the Top 10 Countries based on GDP has changed over the years in the given dataset. For that we need to build individual plots for each year.

staticplot = ggplot(gdp_formatted, aes(rank, group = country_name, 
                                       fill = as.factor(country_name), color = as.factor(country_name))) +
  geom_tile(aes(y = value/2,
                height = value,
                width = 0.9), alpha = 0.8, color = NA) +
  geom_text(aes(y = 0, label = paste(country_name, " ")), vjust = 0.2, hjust = 1) +
  geom_text(aes(y=value,label = Value_lbl, hjust=0)) +
  coord_flip(clip = "off", expand = FALSE) +
  scale_y_continuous(labels = scales::comma) +
  scale_x_reverse() +
  guides(color = FALSE, fill = FALSE) +
  theme(axis.line=element_blank(),
        axis.text.x=element_blank(),
        axis.text.y=element_blank(),
        axis.ticks=element_blank(),
        axis.title.x=element_blank(),
        axis.title.y=element_blank(),
        legend.position="none",
        panel.background=element_blank(),
        panel.border=element_blank(),
        panel.grid.major=element_blank(),
        panel.grid.minor=element_blank(),
        panel.grid.major.x = element_line( size=.1, color="grey" ),
        panel.grid.minor.x = element_line( size=.1, color="grey" ),
        plot.title=element_text(size=25, hjust=0.5, face="bold", colour="grey", vjust=-1),
        plot.subtitle=element_text(size=18, hjust=0.5, face="italic", color="grey"),
        plot.caption =element_text(size=8, hjust=0.5, face="italic", color="grey"),
        plot.background=element_blank(),
        plot.margin = margin(2,2, 2, 4, "cm"))
anim = staticplot + transition_states(year, transition_length = 4, state_length = 1) +
  view_follow(fixed_x = TRUE)  +
  labs(title = 'GDP per Year : {closest_state}',  
       subtitle  =  "Top 10 Countries",
       caption  = "GDP in Billions USD | Data Source: World Bank Data")

Animation

animate(anim, 200, fps = 20,  width = 1200, height = 1000, 
        renderer = gifski_renderer("gganimate.gif"))
## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?

## Warning: Position guide is perpendicular to the intended axis. Did you mean to
## specify a different guide `position`?