library(ggplot2)
library(sf)
## Linking to GEOS 3.7.0, GDAL 2.4.0, PROJ 5.2.0
data("wrld_simpl", package = "maptools")
x <- st_buffer(sf::st_as_sf(wrld_simpl), 0)
## Loading required package: sp
## Warning in st_buffer.sfc(st_geometry(x), dist, nQuadSegs, endCapStyle =
## endCapStyle, : st_buffer does not correctly buffer longitude/latitude data
## dist is assumed to be in decimal degrees (arc_degrees).
x <- st_wrap_dateline(x, options = c("WRAPDATELINE=YES", "DATELINEOFFSET=180"))
## Warning in CPL_wrap_dateline(st_geometry(x), options, quiet): GDAL Error
## 1: IllegalArgumentException: Points of LinearRing do not form a closed
## linestring
## Warning in CPL_wrap_dateline(st_geometry(x), options, quiet): GDAL Error
## 1: IllegalArgumentException: Points of LinearRing do not form a closed
## linestring
xc <- 147
xx <- rbind(
st_set_crs(dplyr::mutate(st_crop(x, st_bbox(c(xmin = -180, xmax = (180 +xc +180)%%360 - 180, ymin = -90, ymax = 90))),
geometry = geometry + c(360, 0)), st_crs(x)),
st_crop(x, st_bbox(c(xmin = (180 +xc +180)%%360 - 180, xmax = 180, ymin = -90, ymax = 90)))
) %>% sf::st_cast("MULTIPOLYGON")
## although coordinates are longitude/latitude, st_intersection assumes that they are planar
## Warning: attribute variables are assumed to be spatially constant
## throughout all geometries
## although coordinates are longitude/latitude, st_intersection assumes that they are planar
## Warning: attribute variables are assumed to be spatially constant
## throughout all geometries
plot(xx[7], reset = FALSE)
abline(v = xc + c(0, 360))

ggplot(xx) + geom_sf(aes(fill = POP2005)) + xlim(c(40, 230)) + ylim(c(-70, 45))
