is there any maps package that has loads of other countries other than the limited maps()

currently working looking into a project, mostly European based. however the maps on rstudio only support Italy and france.

is there any other package that has extra map or country longitudes and latitudes out there?

I think you are a little bit confused, RStudio is an IDE (Integrated Development Environment) it doesn't come with any built-in mapping capability, however, there are a lot of options for mapping in R (which one to use depends on your personal preferences and the kind of map you are looking for), as an example here is simple map of Germany and Poland.

library(tidyverse)
library(rnaturalearth)

germany_poland <- ne_states(country = c("germany", "poland"), returnclass = "sf") %>%
    select(name)

ggplot(germany_poland) +
    geom_sf() +
    geom_sf_text(aes(label = name), size = 2, color = "blue") +
    labs(title = "Germany and Poland") +
    theme_minimal() +
    theme(plot.title = element_text(hjust = 0.5, size = 20),
          axis.title = element_blank(),
          plot.background = element_blank(),
          plot.margin = margin(5, 0, 5, 0))

Created on 2019-09-24 by the reprex package (v0.3.0.9000)

1 Like

While not a package the GADM site has lots of country & lower administrative area polygons available for download in R friendly (rds of a sf object) format.
https://gadm.org/data.html

Note that it is released under NC license, which is not uncommon for data like these.

2 Likes

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.