library(rgdal)
library(sp)
temp <- tempfile()
url <- "http://mapaspects.org/sites/default/files/webfm/website/tutorial/pyramids.zip"
download.file(url,temp, mode="wb")
unzip(temp, "pyramids.csv")
pyram <- read.table("pyramids.csv", header=T, sep=",")
n<-dim(pyram)[1]
pyramegypt <- pyram[1:(n-3),]
pyramegypt$Lat <- as.numeric(as.character(pyramegypt$Lat))
pyramegypt$Long <- as.numeric(as.character(pyramegypt$Long))
suppressWarnings(library(leaflet))
pyramegypt %>% leaflet() %>% addTiles() %>%
addCircleMarkers(popup = pyramegypt$Name)