library(rgeolocate)
## Warning: package 'rgeolocate' was built under R version 3.3.1
library(leaflet)
## Warning: package 'leaflet' was built under R version 3.3.1
library(maps)
## 
##  # maps v3.1: updated 'world': all lakes moved to separate new #
##  # 'lakes' database. Type '?world' or 'news(package="maps")'.  #
ips<-c("156.36.34.9", "134.34.56.7")
locations<- ip_api(ips)

world <- map("world", fill = TRUE, plot = FALSE)

leaflet(data=world) %>% 
  addTiles() %>% 
  addCircleMarkers(locations$longitude, locations$latitude, 
                   color = '#ff0000', popup=ips)