I have this code and I'm using RStudio
library(tidyverse)
library(osmdata)
bbx <- getbb("hawaii")
border <- bbx %>%
opq() %>%
add_osm_feature(key = "place",
value = c("island")) %>%
osmdata_sf()
border
ggplot() +
geom_sf(
data = border$osm_lines,
inherit.aes = FALSE,
color = "black",
size = .4,
alpha = .8
)
when I plot this I have this
As you can see instead of the degree symbol I have a white rectangle in labels.
How can I solve this problem?
Thanks in advance
P.S.: I'm using Window11 64bit and RStudio updated with default options and all packages updated.