Jan 17, 2019
sf
, by both users and developersst_intersects
, st_intersection
etc.geom_sf
is now in ggplot2
, and takes care of (re)projecting incompatible layerssuppressPackageStartupMessages(library(tidyverse)) suppressPackageStartupMessages(library(sf)) system.file("gpkg/nc.gpkg", package="sf") %>% read_sf -> nc nc2 <- nc %>% select(SID74, SID79) %>% gather(VAR, SID, -geom) ggplot() + geom_sf(data = nc2, aes(fill = SID)) + facet_wrap(~VAR, ncol = 1)
tidyr::gather
)sf
has no raster support, no solid vector \(\leftrightarrow\) raster integration