Interactive Leaflet map (2018-01-21)

Sourcecode for Example

mymap <- leaflet() %>%
    addProviderTiles(providers$OpenStreetMap) %>%
    addTiles() %>%
    addMarkers(lat = 50.823487, lng = 7.129989,
               popup = "Our old house") %>%
    addMarkers(lat = 50.829496, lng = 7.127237,
               popup = "<a href='http://www.asselbachschule.de/'>
               Asselbachschule</a><br>Pretty good school") %>%
    addPolylines(lat = c(50.823487, 50.824030, 50.825039,
                         50.825918, 50.826464, 50.827116,
                         50.829496),
                 lng = c(7.129989, 7.130780, 7.129442,
                         7.127433, 7.126033, 7.124607,
                         7.127237), color = "red") %>%
    addLegend(position = "bottomleft", labels = "Best way to school",
              colors = "red") %>%
    addEasyButtonBar(easyButton(icon = "fa-crosshairs",
                                title = "Home",
                                onClick = JS("function(btn, map)
                                             { map.setView([50.823487,
                                             7.129989], 16); } ")),
                     easyButton(icon = "fa-crosshairs",
                                title = "School",
                                onClick = JS("function(btn, map)
                                             { map.setView([50.829496,
                                             7.127237], 16); } "))
                     ) %>%
    addMiniMap()

mymap