r - gganimate::transition_time 导致飞行多边形

标签 r ggplot2 gganimate

尝试创建具有简单功能的动画,本质上是分区统计图形式的空间变量的时间序列。

问题是在动画播放时多边形会飞遍整个绘图。

这是一个可重现的示例,部分摘自 https://www.blog.cultureofinsight.com/2017/09/animated-choropleth-maps-in-r/ (它使用旧版本的gganimate

加载包:

library(tidyverse) # dev ggplot version required: devtools::install_github("hadley/ggplot2")
library(sf)
library(readxl)
library(httr)
library(gganimate)

获取并组织可重现示例的数据。

# download the natural earth shapefile we need into your working directory
URL <- "http://www.naturalearthdata.com/http//www.naturalearthdata.com/download/110m/cultural/ne_110m_admin_0_map_units.zip"
temp <- tempfile()
download.file(URL, temp)
unzip(temp)
unlink(temp)

# read in shapefile as an sf object and set the projection
# this will be our base world map for plot sans Antarctica
world <- st_read("ne_110m_admin_0_map_units.shp") %>% 
  st_transform(crs = "+proj=longlat +datum=WGS84") %>% 
  filter(!NAME %in% c("Fr. S. Antarctic Lands", "Antarctica"))

# download dataset into your working directory
url <- "https://www.blog.cultureofinsight.com/data/wc.xlsx"
GET(url, write_disk("wc.xlsx", overwrite=TRUE))

# read in our the massive 20 rows of data and get the winner/runner-up variable in 1 column #tidyafdata
# setting factor for winner to show first in the legend
winners <- read_excel("wc.xlsx") %>% 
  gather(w_l, country, winner:runner_up) %>% 
  mutate(w_l = factor(w_l, levels = c("winner", "runner_up")))

# merge our world shape file with our main dataset
# this will add the polygon for the appropriate country to each row of our winners dataset
# and remove any countries that haven't won or come 2nd in the WC
wc_geo <- left_join(world, winners, by = c("NAME" = "country")) %>%
  st_as_sf() %>%
  drop_na(Year)

创建 gganimate 对象:

wc_map <- ggplot() +
  geom_sf(data = world, colour = "#ffffff20", fill = "#2d2d2d60", size = .5) +
  geom_sf(data = wc_geo, aes(fill = w_l)) +
  coord_sf(crs = st_crs(world), datum = NA) +
  scale_fill_manual(values = c("#D9A441", "#A8A8A8"), name = NULL, labels = c("Winner", "Runner-Up")) +
  theme(legend.position = c(0.9, 1.01), legend.direction = "horizontal", axis.text = element_blank(), 
        panel.grid.minor = element_blank(), panel.grid.major = element_blank()) +
  transition_time(Year)

动画:

animate(wc_map)

这是结果:

Flying countries

最佳答案

这是一个分组问题。你需要对你的团体明确。在本例中,创建 Yearw_l

的交互

您可以使用rnaturalearth包更方便地获取世界/国家 map 。

library(tidyverse) 
library(gganimate)

world <- rnaturalearth::ne_countries( returnclass = 'sf') %>% filter(admin!= 'Antarctica')

url <- "https://www.blog.cultureofinsight.com/data/wc.xlsx"
httr::GET(url, httr::write_disk("wc.xlsx", overwrite=TRUE))

winners <- readxl::read_excel("wc.xlsx") %>% 
  gather(w_l, country, winner:runner_up) %>% 
  mutate(w_l = factor(w_l, levels = c("winner", "runner_up")))

wc_geo <- left_join(world, winners, by = c("admin" = "country")) %>%
  drop_na(Year)

p <- 
  ggplot() +
  geom_sf(data = world, colour = "#ffffff20", fill = "#2d2d2d60", size = .5) +
  geom_sf(data = wc_geo, aes(fill = w_l, group = interaction(w_l, Year))) +
  scale_fill_manual(values = c("#D9A441", "#A8A8A8"), name = NULL, labels = c("Winner", "Runner-Up")) +
  theme(legend.position = c(0.9, 1.01), legend.direction = "horizontal", axis.text = element_blank(), 
        panel.grid.minor = element_blank(), panel.grid.major = element_blank())

anim <- p + transition_time(Year)

animate(anim)

reprex package于2020年4月24日创建(v0.3.0)

附注总是相同的国家,不是吗...

关于r - gganimate::transition_time 导致飞行多边形,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/61399792/

相关文章:

r - 将图像添加到 geom_line 末尾

r - 使用滑动窗口制作 ggplot 时间序列图动画

在 gganimate 中将动画 barplot 条上的标签舍入?

r - gganimate 根据时间对多条路径进行动画处理

r - 如何在ggplot2中为相同的美学设置多个图例?

python - 在 Snakemake 中全局加载 R 库

r - 为 ggplot 中的堆积条形图着色 : what if my fill variable is comprised of several columns?

r - 使用 ggplot2 绘制组的时间序列图

R:将行 reshape 为列并用 NA 填充

r - 比较多个不同长度的向量