We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
2 parents 24a7dfa + 38f546f commit eb3cd7cCopy full SHA for eb3cd7c
R/normalize-sp.R
@@ -92,7 +92,9 @@ to_multipolygon.Polygons <- function(pgons) {
92
# If Polygons contains more than one Polygon, then we may be dealing with
93
# a polygon with holes or a multipolygon (potentially with holes). Use
94
# createPolygonsComment to validate and determine what the situation is.
95
- comment <- rgeos::createPolygonsComment(pgons)
+ comment <- comment(pgons)
96
+ if (is.null(comment) || comment == "FALSE")
97
+ comment <- rgeos::createPolygonsComment(pgons)
98
pstatus <- as.integer(strsplit(comment, " ")[[1]])
99
lapply(which(pstatus == 0L), function(index) {
100
# Return a list of rings, exterior first
0 commit comments