from wikipedia Shikoku Pilgrimage
url <- "https://en.wikipedia.org/wiki/Shikoku_Pilgrimage"
pilgr <- read_html(url) %>% html_nodes(xpath = '//table[@class = "wikitable sortable"]') %>% html_table %>% extract2(1)
coord <- pilgr $ Coordinates %>% str_extract_all (pattern = "[1-9][1-9]\\.[0-9]+|[1-9][1-9][1-9]\\.[0-9]+", simplify = TRUE) %>% extract(,1:2)%>% as.data.frame(stringsAsFactors = FALSE) %>% mutate_each(funs(as.numeric))
pilgr %>% cbind(coord) %>% leaflet %>% addTiles () %>% addMarkers(lng=~V2, lat=~V1, popup = ~Temple)