Using Required packages

library(leaflet)
library(htmltools)

Accessing the data from .csv text file

From Kagle: Dataset about the best restaurants in the world. (https://www.kaggle.com/mmayur/the-worlds-50-best-restaurants)

setwd("c:/users/Khushi/Downloads")
datamap <- read.csv(file = "TheWorlds50BestRestaurants2018.csv", header = TRUE, sep = ",")

Creating my data frame in order to manipulate the dataset

mimapa <- data.frame(Ranking = datamap$Ranking,
                     Name = datamap$Name,
                     City = datamap$City,
                     Country = datamap$Country,
                     Latitude = datamap$Latitude,
                     Longitude = datamap$Longitude
                     )

Activating the map

map <- mimapa %>%
  leaflet() %>%
  addTiles() %>%
  addMarkers(popup=paste
             ("<br>Country: ", 
               htmlEscape(mimapa$Country), 
              "<br>City: ", 
               htmlEscape(mimapa$City), 
              "<br>Restaurant: ", 
               htmlEscape(mimapa$Name),
              "<br>Ranking: ",
               formatC(datamap$Ranking, format = "d", big.mark = ",")
              ) 
            )
## Assuming "Longitude" and "Latitude" are longitude and latitude, respectively
map