please make a map of your home state / neighborhood or region.

install

library(leaflet)
library(maptools)
## Loading required package: sp
## Checking rgeos availability: TRUE

use a POINTS/MARKERS layer and a POLYGON layer together

leaflet() %>% addTiles()
leaflet() %>% 
  addTiles() %>% 
  addCircleMarkers(lng = -73.984016, lat = 40.754932, color = 'red')
m = leaflet() %>% addTiles() %>% 
     addCircleMarkers(lng = -73.984016, lat = 40.754932, color = 'red')

countylines <- readShapeSpatial("~/Desktop/NYCountyShp/cty036.shp")
## Warning: use rgdal::readOGR or sf::st_read

## Warning: use rgdal::readOGR or sf::st_read
countylines <- readShapeSpatial("~/Desktop/NYCountyShp/cty036.shp")
## Warning: use rgdal::readOGR or sf::st_read

## Warning: use rgdal::readOGR or sf::st_read
countylines$proj4string <- "+proj=longlat +ellps=clrk66"
m %>% addPolygons(data=countylines, fill = TRUE, color = "blue")

use appropriate colors, shading, transparency to make the map visually effective

m %>% addPolygons(data=countylines, 
                                 fill = TRUE, 
                                 color = "yellow", 
                                 fillOpacity= 0.4, 
                                 stroke = FALSE)

adding a Popup marker to make your points display a value if clicked on

m %>% addPopups(-73.984016,40.754932, "My NYC Apartment!")

include a title

m %>% addLegend(pal = pal, values = ~estimate, position=“bottomleft”, title = “NY County & NYC”)