A quick interactive map of France and its top 10 biggest cities :

library(dplyr)
library(leaflet)

# villes_france is a dataset I have on my computer that I loaded with read.csv
villes_france <- read.csv("../../../../Documents/villes_france.csv")
top_ten <- villes_france %>% arrange(desc(Population.en.2010))
top_ten <- filter(top_ten, Population.en.2010 >= top_ten$Population.en.2010[10])

md_cities <- data.frame(name = top_ten$Nom.reel,
                        pop = top_ten$Population.en.2010,
                        lat = top_ten$latitude,
                        lng = top_ten$longitude)
md_cities %>%
  leaflet() %>%
  addTiles() %>%
  addCircles(weight = 1, 
             radius = sqrt(md_cities$pop) * 30)