有没有办法识别重叠区域的地理区域,而不仅仅是边界?
Is there a way to identify geographies that overlap areas, not just borders?
我正在尝试获取一个邮政编码数据集并将其限制为芝加哥内的邮政编码。但是,我尝试执行此合并的任何方式都会捕获太多或太少的邮政编码。这是一个可重现的例子:
## Load packages
library(tigris)
library(sf)
library(ggplot2)
## Load shapefiles
ZIPs <- tigris::zctas(cb = TRUE)
ZIPs <- sf::st_as_sf(ZIPs)
places <- tigris::places(state = "17", cb = T)
chicago <- places[places$NAME == "Chicago",]
chicago <- sf::st_as_sf(chicago)
## Filter ZIPs to those within Chicago using st_intersects
overlap <- st_filter(ZIPs, chicago, .predicate = st_intersects) #Using st_intersects captures too many ZIPs
## Visualize ZIPs vs Chicago
ggplot() +
geom_sf(data = overlap, color = "black", size = 1) +
geom_sf(data = chicago, color = NA, fill = "blue", alpha = .25)
## Try again using st_within
overlap <- st_filter(ZIPs, chicago, .predicate = st_within) #Using st_within captures too few ZIPs
## Visualize ZIPs vs Chicago
ggplot() +
geom_sf(data = overlap, color = "black", size = 1) +
geom_sf(data = chicago, color = NA, fill = "blue", alpha = .25)
我也曾尝试使用 sp::over
来完成此任务,但 运行 遇到了同样的问题。显然有一些 ZIP 大部分位于芝加哥以外,但合理地有一些重叠(例如,第一张地图左上角的三个 ZIP)。然而,还有其他一些仅沿边界相交(例如右上角),甚至看起来根本不相交(右下角)。我想从这张地图中 排除 任何仅与边界相交的 ZIP。有什么建议吗?
我希望比我知识渊博的人可以给你一个更好的答案,以便更好地理解发生了什么。现在,我可以通过排除 st_touches
returns TRUE 的 ZCTA 来改进一点。看来我们仍然会遇到一些不受欢迎的 ZCTA。您还可以评估每个 ZCTA 与芝加哥的交叉区域,以查看该区域是什么(以了解为什么要返回这些区域)——在某些情况下,我们谈论的是大量重叠。
overlap <- st_filter(ZIPs, chicago, .predicate = st_intersects)
overlap_extra <- st_filter(overlap, chicago, .predicate = st_touches)
nrow(overlap_extra) # Will remove 8 ZCTAs that are touching only
overlap_removed <-
overlap[-which(overlap$ZCTA5CE10 %in% overlap_extra$ZCTA5CE10), ]
ggplot() +
geom_sf(data = overlap, color = "black", size = 1) +
geom_sf(data = overlap_removed, color = "red", fill = "red", alpha = 0.2,
size = 1) +
geom_sf(data = chicago, color = NA, fill = "blue", alpha = .25)
area_intersections <- rep(NA, nrow(overlap_removed))
# Probably not the most efficient way of doing this --
for (i in seq(nrow(overlap_removed))) {
area_intersections[i] <-
st_area(
st_intersection(
st_geometry(overlap_removed[i, ]), st_geometry(chicago)))
}
summary(area_intersections)
length(which(area_intersections < 1)) # 1 has less than 1m^2 overlap
length(which(area_intersections < 1000)) # 3 have less than 1km^2 overlap
# Small improvement -- if you really want to remove more ZCTAs
overlap_removed2 <- overlap_removed[-which(area_intersections < 1000), ]
ggplot() +
geom_sf(data = overlap_removed, color = "black", size = 1) +
geom_sf(data = overlap_removed2, color = "red", fill = "red", alpha = 0.2,
size = 1) +
geom_sf(data = chicago, color = NA, fill = "blue", alpha = .25)
这里我提出了一个函数,可以根据相交面积与原始面积之比与阈值的比值来过滤ZIPs
。以下是如何使用此功能的示例。看起来 threshold = 0.3
效果很好,但您可以根据需要设置任何阈值。
## Load packages
library(tigris)
library(sf)
library(ggplot2)
library(dplyr)
# A function that can filter ZIPs based on the ratio of intersected area to original area
# The default of the threshold is set to be 0.3
# If the ratio is larger than or equal to 0.3, that ZIPs would be kept
intersection_area <- function(x, y, threshold = 0.3){
z <- st_intersection(x, y)
z2 <- z %>%
mutate(Area_Inter = as.numeric(st_area(.))) %>%
select(ZCTA5CE10, Area_Inter) %>%
st_set_geometry(NULL)
x2 <- x %>%
st_filter(y, .predicate = st_intersects) %>%
mutate(Area = as.numeric(st_area(.))) %>%
select(ZCTA5CE10, Area) %>%
left_join(z2, by = "ZCTA5CE10") %>%
mutate(Area_Ratio = Area_Inter/Area) %>%
filter(Area_Ratio >= threshold)
return(x2)
}
overlap <- intersection_area(ZIPs, chicago)
## Visualize ZIPs vs Chicago
ggplot() +
geom_sf(data = overlap, color = "black", size = 1) +
geom_sf(data = chicago, color = NA, fill = "blue", alpha = .25)
这是我想到的另一个选项,使用 st_filter
中的自定义谓词函数
st_overlaps_with_threshold = function(x, y, threshold) {
int = st_intersects(x, y)
lapply(seq_along(int), function(ix)
if (length(int[[ix]]))
int[[ix]][which(as.numeric(suppressMessages(st_area(st_intersection(x[ix,], y[int[[ix]],])) / st_area(x[ix,]))) > threshold)]
else
integer(0)
)
}
overlap <- st_filter(ZIPs, chicago, .predicate = st_overlaps_with_threshold, threshold = .05)
我正在尝试获取一个邮政编码数据集并将其限制为芝加哥内的邮政编码。但是,我尝试执行此合并的任何方式都会捕获太多或太少的邮政编码。这是一个可重现的例子:
## Load packages
library(tigris)
library(sf)
library(ggplot2)
## Load shapefiles
ZIPs <- tigris::zctas(cb = TRUE)
ZIPs <- sf::st_as_sf(ZIPs)
places <- tigris::places(state = "17", cb = T)
chicago <- places[places$NAME == "Chicago",]
chicago <- sf::st_as_sf(chicago)
## Filter ZIPs to those within Chicago using st_intersects
overlap <- st_filter(ZIPs, chicago, .predicate = st_intersects) #Using st_intersects captures too many ZIPs
## Visualize ZIPs vs Chicago
ggplot() +
geom_sf(data = overlap, color = "black", size = 1) +
geom_sf(data = chicago, color = NA, fill = "blue", alpha = .25)
## Try again using st_within
overlap <- st_filter(ZIPs, chicago, .predicate = st_within) #Using st_within captures too few ZIPs
## Visualize ZIPs vs Chicago
ggplot() +
geom_sf(data = overlap, color = "black", size = 1) +
geom_sf(data = chicago, color = NA, fill = "blue", alpha = .25)
我也曾尝试使用 sp::over
来完成此任务,但 运行 遇到了同样的问题。显然有一些 ZIP 大部分位于芝加哥以外,但合理地有一些重叠(例如,第一张地图左上角的三个 ZIP)。然而,还有其他一些仅沿边界相交(例如右上角),甚至看起来根本不相交(右下角)。我想从这张地图中 排除 任何仅与边界相交的 ZIP。有什么建议吗?
我希望比我知识渊博的人可以给你一个更好的答案,以便更好地理解发生了什么。现在,我可以通过排除 st_touches
returns TRUE 的 ZCTA 来改进一点。看来我们仍然会遇到一些不受欢迎的 ZCTA。您还可以评估每个 ZCTA 与芝加哥的交叉区域,以查看该区域是什么(以了解为什么要返回这些区域)——在某些情况下,我们谈论的是大量重叠。
overlap <- st_filter(ZIPs, chicago, .predicate = st_intersects)
overlap_extra <- st_filter(overlap, chicago, .predicate = st_touches)
nrow(overlap_extra) # Will remove 8 ZCTAs that are touching only
overlap_removed <-
overlap[-which(overlap$ZCTA5CE10 %in% overlap_extra$ZCTA5CE10), ]
ggplot() +
geom_sf(data = overlap, color = "black", size = 1) +
geom_sf(data = overlap_removed, color = "red", fill = "red", alpha = 0.2,
size = 1) +
geom_sf(data = chicago, color = NA, fill = "blue", alpha = .25)
area_intersections <- rep(NA, nrow(overlap_removed))
# Probably not the most efficient way of doing this --
for (i in seq(nrow(overlap_removed))) {
area_intersections[i] <-
st_area(
st_intersection(
st_geometry(overlap_removed[i, ]), st_geometry(chicago)))
}
summary(area_intersections)
length(which(area_intersections < 1)) # 1 has less than 1m^2 overlap
length(which(area_intersections < 1000)) # 3 have less than 1km^2 overlap
# Small improvement -- if you really want to remove more ZCTAs
overlap_removed2 <- overlap_removed[-which(area_intersections < 1000), ]
ggplot() +
geom_sf(data = overlap_removed, color = "black", size = 1) +
geom_sf(data = overlap_removed2, color = "red", fill = "red", alpha = 0.2,
size = 1) +
geom_sf(data = chicago, color = NA, fill = "blue", alpha = .25)
这里我提出了一个函数,可以根据相交面积与原始面积之比与阈值的比值来过滤ZIPs
。以下是如何使用此功能的示例。看起来 threshold = 0.3
效果很好,但您可以根据需要设置任何阈值。
## Load packages
library(tigris)
library(sf)
library(ggplot2)
library(dplyr)
# A function that can filter ZIPs based on the ratio of intersected area to original area
# The default of the threshold is set to be 0.3
# If the ratio is larger than or equal to 0.3, that ZIPs would be kept
intersection_area <- function(x, y, threshold = 0.3){
z <- st_intersection(x, y)
z2 <- z %>%
mutate(Area_Inter = as.numeric(st_area(.))) %>%
select(ZCTA5CE10, Area_Inter) %>%
st_set_geometry(NULL)
x2 <- x %>%
st_filter(y, .predicate = st_intersects) %>%
mutate(Area = as.numeric(st_area(.))) %>%
select(ZCTA5CE10, Area) %>%
left_join(z2, by = "ZCTA5CE10") %>%
mutate(Area_Ratio = Area_Inter/Area) %>%
filter(Area_Ratio >= threshold)
return(x2)
}
overlap <- intersection_area(ZIPs, chicago)
## Visualize ZIPs vs Chicago
ggplot() +
geom_sf(data = overlap, color = "black", size = 1) +
geom_sf(data = chicago, color = NA, fill = "blue", alpha = .25)
这是我想到的另一个选项,使用 st_filter
st_overlaps_with_threshold = function(x, y, threshold) {
int = st_intersects(x, y)
lapply(seq_along(int), function(ix)
if (length(int[[ix]]))
int[[ix]][which(as.numeric(suppressMessages(st_area(st_intersection(x[ix,], y[int[[ix]],])) / st_area(x[ix,]))) > threshold)]
else
integer(0)
)
}
overlap <- st_filter(ZIPs, chicago, .predicate = st_overlaps_with_threshold, threshold = .05)