首页 > 解决方案 > 使用 ggplot 在绘图上绘制地图

问题描述

如果我想在情节上绘制地图,我这样做

library(ggplot2)
library(sf)
library(cowplot)
library(gridExtra)
library(raster)

df <- data.frame(x = 1980:1999, y = sample(1:20, 20, replace = T))
shp.dat <- getData('GADM', country='FRA', level=1)

shp.dat <- shp.dat %>% st_as_sf()

p <- ggplot(df, aes(x = x, y = y)) + geom_line() + ylim(0, 100)
p.shp <- ggplot() +  
        geom_sf(data = shp.dat, fill = ifelse(shp.dat$ID_1 == 1,"red", "grey")) 
inset_map <- ggdraw() + draw_plot(p, 0, 0, 1, 1) + draw_plot(p.shp, 0.5, 0.52, 0.5, 0.4) 
inset_map

在此处输入图像描述

现在我有四个像这样绘制的图

  df <- data.frame(x = 1980:1999, 
                 y1 = sample(1:20, 20, replace = T), 
                 y2 = sample(1:20, 20, replace = T), 
                 y3 = sample(1:20, 20, replace = T), 
                 y4 = sample(1:20, 20, replace = T))


p1 <- ggplot(df, aes(x = x, y = y1)) + geom_line() + ylim(0, 100)
p2 <- ggplot(df, aes(x = x, y = y2)) + geom_line() + ylim(0, 100)
p3 <- ggplot(df, aes(x = x, y = y3)) + geom_line() + ylim(0, 100)
p4 <- ggplot(df, aes(x = x, y = y4)) + geom_line() + ylim(0, 100)

pp <- grid.arrange(p1, p2, p3, p4, ncol = 2)

对于每个情节,我想将地图添加为插图

inset_map <- ggdraw() + draw_plot(pp, 0, 0, 1, 1) + draw_plot(p.shp, 0.5, 0.52, 0.5, 0.4)

在此处输入图像描述

如何将地图分别显示为每个图中的插图?

标签: rggplot2shapefile

解决方案


inset_map在将结果传递给之前,您可以应用与生成单个 相同的代码逻辑grid.arrange()

plot.list <- list(p1, p2, p3, p4)

plot.list %>%

  # add inset map to each plot in the list
  lapply(function(p) ggdraw() + 
           draw_plot(p, 0, 0, 1, 1) + 
           draw_plot(p.shp, 0.5, 0.52, 0.5, 0.4)) %>%

  # convert each plot in the list to grob
  lapply(ggplotGrob) %>%

  # arrange in grid, as before
  grid.arrange(grobs = ., ncol = 2)

阴谋


推荐阅读