date()
## [1] "Tue Aug 14 21:18:11 2018"
date()
## [1] "Tue Aug 14 21:18:11 2018"
library(leaflet)
# Generate two random numbers as latitude and longitude
set.seed(2018)
location <- data.frame(lat = runif(10, min = -10, max = 10),
lng = runif(10, min = -10, max = 10))
map <- location %>%
leaflet() %>%
addTiles() %>%
addMarkers(popup = "Some Random Places",
clusterOptions = markerClusterOptions())
map