gpt4 book ai didi

r - 如何确保文本标题位于多边形对象内部?

转载 作者:行者123 更新时间:2023-12-02 07:30:06 26 4
gpt4 key购买 nike

我正在制作一个 map ,我想在每个州内放置一个小文本标签。我当前的问题是文本超出了州限制,因此看起来不太好: enter image description here

我尝试使用均值、中位数、质心等。

我想要的是每个文本都完全位于多边形内部或外部,如下所示: enter image description here (图片来自http://www.businessinsider.com/map-what-100-is-actually-worth-in-your-state-2015-7?IR=T)

我使用以下代码来生成我的图片:

library(maps)
library(dplyr)
library(ggplot2)

#data
mapbase <- map_data("state.vbm")
data(state.vbm.center)
df <- state.vbm.center %>% as.data.frame() %>%
mutate(region = unique(mapbase$region) ) %>% full_join(mapbase)


#actual plotting
cnames <- aggregate(cbind(long, lat) ~ region, data=df, FUN=median)
gmap<-
ggplot()+
geom_polygon( data=df2,
aes(long, lat, group = region, fill = somevalue,alpha=0.3)) +
coord_fixed() +
theme_void() +
geom_text(data=cnames, aes( fontface=2 ,cnames$long, cnames$lat , label = "text"
), color= "black" ,size=3,check_overlap = T, position=position_jitter(width=3, height=3) ) +

scale_fill_gradient(low="red",high="blue")

非常感谢您的提示!

最佳答案

需要考虑的几点。

1 - 多边形内用于注释目的的最佳位置

在理想的世界中,每个多边形都类似于一个圆,并且其中心是放置文本标签的最佳位置(例如德克萨斯州)。实际上, map 区域有各种形状,甚至可能不是一个整体(例如密歇根州)。数学平均值/中点可能位于多边形的边缘或外部(例如佛罗里达)。

R 不太擅长解决这些复杂问题。我会使用 GIS 软件。

但是,如果您的用例是美国,则 state.vbm.center 数据集已经附带了一组非常好的默认坐标。其帮助文件指出:

state.vbm.center are coordinates of the state centers for annotation purposes.

让我们看看这些点在哪里:

#data 
mapbase <- map_data("state.vbm")
data(state.vbm.center)

cnames <- state.vbm.center %>% as.data.frame() %>%
mutate(region = unique(mapbase$region))

#actual plotting
ggplot()+
geom_polygon( data=mapbase,
aes(long, lat, group = region, fill = region),
alpha = 0.3) +
coord_fixed() + theme_void() +
geom_point(data = cnames,
aes(x, y)) +
scale_fill_discrete(guide = F)

center location

这还不算太破烂。如果您需要标记的只是州名,这应该足够了:

cnames$abb <- state.abb

ggplot()+
geom_polygon( data=mapbase,
aes(long, lat, group = region, fill = region),
alpha = 0.3) +
coord_fixed() + theme_void() +
geom_text(data=cnames,
aes(x, y , label = abb),
color= "black", size=3, fontface = 2,
hjust = 0.5, vjust = 0.5) + #central alignment
scale_fill_discrete(guide = F)

abbreviated names

2 - 将长标签装入狭小的空间

它非常适合 map 多边形内的短标签,但如果您想包含更多信息(每个州的全名、出生率、犯罪率、失业率、教育水平、收入范围、人口密度、人口比例)在上次选举中投票,...),最终你将开始用完较小/形状更奇怪的多边形中的空间。

此时可以采用双重方法,将信息保留在较大的多边形内,并将较小的多边形单独放置在一侧,就像部分图例一样。对于美国各州来说,州面积是标准datasets包的一部分,这省去了我们计算它的麻烦:

# incorporate area information & identify small area states
cnames$area <- state.area
ggplot(cnames %>%
mutate(region = factor(region, levels = region[order(area)])),
aes(x = region, y = area)) + geom_col() +
theme_classic() +
theme(axis.text.x = element_text(angle = 90, vjust = 0.5, hjust = 1))

# the first 7 states (up to Maryland) are noticeably smaller than the rest

sorted by area size

在 map 上为小州选择一些漂亮的空白区域。我决定将它们垂直排列在 1 列中,经度 = 140,纬度范围从 0 到 60:

library(tidyr)

legend.states <- cnames$region[which(cnames$area <= 10577)]
legend.states <- as.data.frame(legend.states)
legend.states$long1 <- 140
legend.states$lat1 <- seq(0, 60, length.out = nrow(legend.states))
legend.states <- legend.states %>%
mutate(long2 = long1 + 5, lat2 = lat1) %>%
mutate(long3 = long2, lat3 = lat2 - 5) %>%
mutate(long4 = long1, lat4 = lat3) %>%
mutate(long5 = long1, lat5 = lat1) %>%
gather(k, v, -legend.states) %>%
mutate(order = as.integer(substring(k, nchar(k))),
k = gsub("[0-9]", "", k)) %>%
spread(k, v) %>%
rename(region = legend.states) %>%
mutate(group = mapbase$group[match(region, mapbase$region)]) %>%
select(long, lat, group, order, region) %>%
mutate(subregion = NA)

# add legend polygons to the original polygon dataset
mapbase2 <- rbind(mapbase, legend.states)

更改这些小状态的注释坐标,使它们与图例框位置对齐:

cnames2 <- left_join(cnames,
legend.states %>% filter(order %in% c(1, 4)) %>%
group_by(region) %>%
summarise(long = mean(long) + 7,
lat = mean(lat))) %>%
mutate(x = coalesce(long, x),
y = coalesce(lat, y),
hjust = ifelse(is.na(lat), 0.5, 0))
# left alignment (hjust=0) for small state text, central alignment (hjust=0.5) otherwise.

将所有内容放在一起:

ggplot()+
geom_polygon( data=mapbase2,
aes(long, lat, group = region, fill = region),
alpha = 0.3) +
coord_fixed() + theme_void() +
geom_text(data=cnames2,
aes(x, y , label = abb, hjust = hjust),
size=3, fontface = 2,
vjust = 0.5) +
scale_fill_discrete(guide = F)

legend box

(注意:对于较长的文本,您可能还需要增加 x 轴限制,和/或插入换行符。)

关于r - 如何确保文本标题位于多边形对象内部?,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/45300662/

26 4 0
Copyright 2021 - 2024 cfsdn All Rights Reserved 蜀ICP备2022000587号
广告合作:1813099741@qq.com 6ren.com