PA Wells

(wellsMap<- leaflet(wells) %>% addTiles() %>% addProviderTiles("Stamen.Toner") %>%
setView(-76.977877, 40.824976, 7) %>% # map location
addCircleMarkers(data=wells, lng=wells$longitude, lat=wells$latitude, radius=5, popup=wells$client,
clusterOptions=markerClusterOptions()
))
count(wells$client)
##                                   x freq
## 1              APEX ENERGY (PA) LLC   51
## 2              CABOT OIL & GAS CORP  368
## 3         CHESAPEAKE APPALACHIA LLC   45
## 4            CHEVRON APPALACHIA LLC   62
## 5               CHIEF OIL & GAS LLC   61
## 6                  EM ENERGY PA LLC   99
## 7                 EQT PRODUCTION CO  544
## 8                 HILCORP ENERGY CO   33
## 9                   JKLM ENERGY LLC   69
## 10       LAUREL MOUNTAIN PRODUCTION    2
## 11               MDS ENERGY DEV LLC   36
## 12         PENNENERGY RESOURCES LLC   59
## 13   RANGE RESOURCES APPALACHIA LLC  663
## 14                   RE GAS DEV LLC   71
## 15              RICE DRILLING B LLC  510
## 16            SENECA RESOURCES CORP  360
## 17                  SNYDER BROS INC   57
## 18                         SWEPI LP   51
## 19            SWN PRODUCTION CO LLC  319
## 20          TALISMAN ENERGY USA INC  136
## 21        TRAVIS PEAK RESOURCES LLC    6
## 22 VANTAGE ENERGY APPALACHIA II LLC  252
## 23                   XTO ENERGY INC   51
pal <- colorNumeric(  palette = "Reds",  domain = parks$OBJECTID )

map2<-leaflet(data = parks) %>%
        setView(-76.977877, 40.824976, 7) %>% # map location
        addProviderTiles("CartoDB.Positron") %>%
        addPolygons(fillColor = ~pal(parks$OBJECTID), fillOpacity = 0.8, color = "#BDBDC3", weight = 1) %>%
        addPolygons(data=forests) %>%
        addPolygons(data=places, fillColor="black")  %>%
        addCircleMarkers(data=wells, lng=wells$longitude, lat=wells$latitude, radius=5, popup=wells$client,
clusterOptions=markerClusterOptions()          )
## Warning in doColorRamp(colorMatrix, x, alpha, ifelse(is.na(na.color), "", :
## '.Random.seed' is not an integer vector but of type 'NULL', so ignored