library(highcharter)
## Highcharts (www.highcharts.com) is a Highsoft software product which is
## not free for commercial and Governmental use
data(worldgeojson, package = "highcharter")
data("GNI2014", package = "treemap")

head(GNI2014)
##   iso3          country     continent population    GNI
## 3  BMU          Bermuda North America      67837 106140
## 4  NOR           Norway        Europe    4676305 103630
## 5  QAT            Qatar          Asia     833285  92200
## 6  CHE      Switzerland        Europe    7604467  88120
## 7  MAC Macao SAR, China          Asia     559846  76270
## 8  LUX       Luxembourg        Europe     491775  75990
GNI2014$value <- GNI2014$population # to make a choropleth

highchart(type = "map") %>% 
  hc_add_series(mapData = worldgeojson, data = list_parse(GNI2014),
                joinBy = "iso3") %>% 
  hc_colorAxis() %>% 
  hc_tooltip(useHTML = TRUE, headerFormat = "",
             pointFormat = "this is {point.name} and have {point.population} people with gni of {point.GNI}")