library(leaflet)
library(curl)
read.csv(curl("https://gist.githubusercontent.com/sfsheath/a076a4ae2e54a17088d2/raw/ramphs.csv")) -> ramphs
load(curl("https://gist.githubusercontent.com/sfsheath/51b4565d843d9a057a43/raw/awmc.RData"))
The popups aren’t very useful yet.
pal <- colorQuantile("YlOrRd", NULL, n = dim(ramphs)[2])
leaflet() %>%
addPolygons(data = awmc.roman.empire.200.sp, color = 'black', stroke = F) %>%
addCircles(ramphs$longitude,ramphs$latitude,
popup = paste(ramphs$label," ",ramphs$capacity),
color = pal(max(ramphs$nearest) - ramphs$nearest)) %>%
addTiles(urlTemplate = "http://a.tiles.mapbox.com/v3/isawnyu.map-knmctlkh/{z}/{x}/{y}.png")