diff --git a/news/index.html b/news/index.html index 759e9649..751df4e9 100644 --- a/news/index.html +++ b/news/index.html @@ -59,6 +59,7 @@

viridisLite palettes (“magma”, “inferno”, “plasma”, “viridis”, “cividis”, “rocket”, “mako”, and “turbo”) (@jack-davison, #924).

  • Updated vignettes to replace sp/raster usage with sf/terra and their corresponding examples. (@jack-davison, #928)

  • Updated vignettes to replace sp/raster usage with sf/`{terra} and their corresponding examples. (@jack-davison, #928)

  • +
  • addProviderTiles() will now error if the chosen provider does not match any currently loaded provider (by default, those in providers). This behaviour can be toggled off by setting the new check argument to FALSE (@jack-davison, #929)

  • leaflet 2.2.2

    CRAN release: 2024-03-26

    diff --git a/pkgdown.yml b/pkgdown.yml index 4b155950..50d1a6e4 100644 --- a/pkgdown.yml +++ b/pkgdown.yml @@ -18,7 +18,7 @@ articles: articles/shiny: shiny.html articles/showhide: showhide.html articles/widget: widget.html -last_built: 2024-08-07T17:09Z +last_built: 2024-08-07T20:01Z urls: reference: https://rstudio.github.io/leaflet/reference article: https://rstudio.github.io/leaflet/articles diff --git a/reference/addProviderTiles.html b/reference/addProviderTiles.html index 94dcd48e..53834cd8 100644 --- a/reference/addProviderTiles.html +++ b/reference/addProviderTiles.html @@ -66,7 +66,8 @@

    Usage provider, layerId = NULL, group = NULL, - options = providerTileOptions() + options = providerTileOptions(), + check = TRUE ) providerTileOptions( @@ -100,15 +101,20 @@

    Argumentsgroup

    the name of the group the newly created layers should belong to -(for clearGroup() and addLayersControl() purposes). -Human-friendly group names are permitted–they need not be short, -identifier-style names.

    +(for clearGroup() and addLayersControl() purposes). Human-friendly +group names are permitted–they need not be short, identifier-style names.

    options

    tile options

    +
    check
    +

    Check that the specified provider matches the available +currently loaded leaflet providers? Defaults to TRUE, but can be toggled +to FALSE for advanced users.

    + +
    errorTileUrl, noWrap, opacity, zIndex, updateWhenIdle, detectRetina

    the tile layer options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tilelayer

    diff --git a/search.json b/search.json index dae4fa53..1c7c9aeb 100644 --- a/search.json +++ b/search.json @@ -1 +1 @@ -[{"path":"https://rstudio.github.io/leaflet/CONTRIBUTING.html","id":null,"dir":"","previous_headings":"","what":"Contributing to {leaflet}","title":"Contributing to {leaflet}","text":"welcome contributions leaflet package! submit contribution: Fork repository make changes. Ensure signed individual corporate contributor agreement appropriate. can send signed copy contribute@rstudio.com. Submit pull request. generally merge pull requests update included web libraries (Bootstrap jQuery) difficult us verify update done correctly; prefer update libraries .","code":""},{"path":"https://rstudio.github.io/leaflet/CONTRIBUTING.html","id":"how-to-make-changes","dir":"","previous_headings":"","what":"How to make changes","title":"Contributing to {leaflet}","text":"submit pull request, please following: Add entry NEWS concisely describing changed. appropriate, add unit tests tests/ directory. Run Build->Check Package RStudio IDE, devtools::check(), make sure change add messages, warnings, errors. things make easier leaflet development team evaluate pull request. Even , may still decide modify code even merge . Factors may prevent us merging pull request include: breaking backward compatibility adding feature consider relevant leaflet hard understand hard maintain future computationally expensive intuitive people use try responsive provide feedback case decide merge pull request.","code":""},{"path":"https://rstudio.github.io/leaflet/CONTRIBUTING.html","id":"filing-issues","dir":"","previous_headings":"","what":"Filing issues","title":"Contributing to {leaflet}","text":"find bug leaflet, can also file issue. Please provide much relevant information can, include minimal reproducible example possible.","code":""},{"path":"https://rstudio.github.io/leaflet/PULL_REQUEST_TEMPLATE.html","id":"pull-request","dir":"","previous_headings":"","what":"Pull Request","title":"NA","text":"submit pull request, please following: Add entry NEWS concisely describing changed. appropriate, add unit tests tests/testthat directory. Run Build->Check Package RStudio IDE, devtools::check(), make sure change add messages, warnings, errors. things make easier leaflet development team evaluate pull request. Even , may still decide modify code even merge . Factors may prevent us merging pull request include: breaking backward compatibility adding feature consider relevant leaflet hard understand hard maintain future computationally expensive intuitive people use try responsive provide feedback case decide merge pull request.","code":""},{"path":"https://rstudio.github.io/leaflet/PULL_REQUEST_TEMPLATE.html","id":"minimal-reproducible-example","dir":"","previous_headings":"","what":"Minimal reproducible example","title":"NA","text":"Finally, please include minimal reprex. goal reprex make easy possible recreate problem can fix . ’ve never heard reprex , start reading https://reprex.tidyverse.org/, follow advice page. include session info unless ’s explicitly asked , ’ve used reprex::reprex(..., session_info = TRUE) hide away. Make sure webshot installed reprex produces images leaflet htmlwidgets. Delete instructions read . Brief description solution PR task list: - [ ] Update NEWS - [ ] Add tests (appropriate) - R code tests: tests/testthat/ - Visual tests: R/zzz_viztest.R - [ ] Update documentation devtools::document()","code":"# make sure webshot is installed to take pictures of htmlwidgets if (!(\"webshot\" %in% installed.packages()[, \"Package\"])) { install.packages(\"webshot\") # restart R process to fully integrate with knitr } reprex::reprex({ library(leaflet) # insert reprex here leaflet() %>% addTiles() }) # insert reprex here"},{"path":"https://rstudio.github.io/leaflet/articles/basemaps.html","id":"default-openstreetmap-tiles","dir":"Articles","previous_headings":"","what":"Default (OpenStreetMap) Tiles","title":"Using Basemaps","text":"easiest way add tiles calling addTiles() arguments; default, OpenStreetMap tiles used.","code":"library(leaflet) m <- leaflet() %>% setView(lng = -71.0589, lat = 42.3601, zoom = 12) m %>% addTiles()"},{"path":"https://rstudio.github.io/leaflet/articles/basemaps.html","id":"third-party-tiles","dir":"Articles","previous_headings":"","what":"Third-Party Tiles","title":"Using Basemaps","text":"Alternatively, many popular free third-party basemaps can added using addProviderTiles() function, implemented using leaflet-providers plugin. See complete set. convenience, leaflet also provides named list third-party tile providers supported plugin. enables use auto-completion feature favorite R IDE (like RStudio) remember look supported tile providers; just type providers$ choose one options. can also use names(providers) view options. Note tile set providers require register; see project page information. can pass access tokens/keys, options, tile provider populating options argument providerTileOptions() function. October 2023, Stamen map tiles now hosted Stadia Maps. Replace references providers$Stamen.____ providers$Stadia.Stamen____ use new tiles. Published maps now require account; created, login register domain(s) maps published.","code":"m %>% addProviderTiles(providers$CartoDB.Positron) m %>% addProviderTiles(providers$Esri.NatGeoWorldMap) m %>% addProviderTiles(providers$OpenTopoMap) m %>% addProviderTiles(providers$Stadia.StamenToner)"},{"path":"https://rstudio.github.io/leaflet/articles/basemaps.html","id":"custom-tile-url-template","dir":"Articles","previous_headings":"","what":"Custom Tile URL Template","title":"Using Basemaps","text":"happen custom map tile URL template use, can provide argument addTiles().","code":""},{"path":"https://rstudio.github.io/leaflet/articles/basemaps.html","id":"wms-tiles","dir":"Articles","previous_headings":"","what":"WMS Tiles","title":"Using Basemaps","text":"can use addWMSTiles() add WMS (Web Map Service) tiles. map shows Base Reflectivity (measure intensity precipitation occurring) using WMS Iowa Environmental Mesonet:","code":"leaflet() %>% addTiles() %>% setView(-93.65, 42.0285, zoom = 4) %>% addWMSTiles( \"http://mesonet.agron.iastate.edu/cgi-bin/wms/nexrad/n0r.cgi\", layers = \"nexrad-n0r-900913\", options = WMSTileOptions(format = \"image/png\", transparent = TRUE), attribution = \"Weather data © 2012 IEM Nexrad\" )"},{"path":"https://rstudio.github.io/leaflet/articles/basemaps.html","id":"combining-tile-layers","dir":"Articles","previous_headings":"","what":"Combining Tile Layers","title":"Using Basemaps","text":"aren’t restricted using single basemap map; can stack adding multiple tile layers. generally makes sense front tiles consist semi transparent tiles, adjusted opacity via options argument.","code":"m %>% addProviderTiles( providers$Esri.WorldImagery, options = providerTileOptions(opacity = 0.5) ) %>% addProviderTiles(providers$CartoDB.VoyagerOnlyLabels)"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"data-source","dir":"Articles","previous_headings":"","what":"Data source","title":"Choropleths","text":"’ll start loading data JSON. Leaflet.js example loads JSON directly JavaScript, Leaflet R package instead want load data R. case, ’ll use sf package load data sf data.frame, let us easily manipulate geographic features, properties, R. can see, now sf data.frame name (state name) density (population density people/mi2) columns GeoJSON.","code":"states <- sf::read_sf(\"https://rstudio.github.io/leaflet/json/us-states.geojson\") class(states) #> [1] \"sf\" \"tbl_df\" \"tbl\" \"data.frame\" names(states) #> [1] \"id\" \"name\" \"density\" \"geometry\""},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"basic-states-map","dir":"Articles","previous_headings":"","what":"Basic states map","title":"Choropleths","text":"Next, let’s make basic map just outline states. basemap, ’ll use \"mapbox.light\" MapBox style example ; don’t MapBox account, can just use addTiles() place addProviderTiles() call, choose free provider. ’ve saved basic basemap separate variable m can easily iterate addPolygons() call work rest tutorial. add uniform polygons default styling, just call addPolygons() additional arguments.","code":"m <- leaflet(states) %>% setView(-96, 37.8, 4) %>% addProviderTiles(\"MapBox\", options = providerTileOptions( id = \"mapbox.light\", accessToken = Sys.getenv('MAPBOX_ACCESS_TOKEN'))) m %>% addPolygons() #> Warning in sf::st_is_longlat(x): bounding box has potentially an invalid #> value range for longlat data"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"adding-some-color","dir":"Articles","previous_headings":"","what":"Adding some color","title":"Choropleths","text":"Now, let’s color states according population density. various options mapping data colors; example ’ll match Leaflet.js tutorial mapping specific set bins RColorBrewer colors. First, ’ll define bins. numeric vector defines boundaries intervals ((0,10], (10,20], ). , ’ll call colorBin() generate palette function maps RColorBrewer \"YlOrRd\" colors bins. Finally, ’ll modify addPolygons() use palette function density values generate vector colors fillColor, also add static style properties.","code":"bins <- c(0, 10, 20, 50, 100, 200, 500, 1000, Inf) pal <- colorBin(\"YlOrRd\", domain = states$density, bins = bins) m %>% addPolygons( fillColor = ~pal(density), weight = 2, opacity = 1, color = \"white\", dashArray = \"3\", fillOpacity = 0.7) #> Warning in sf::st_is_longlat(x): bounding box has potentially an invalid #> value range for longlat data"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"adding-interaction","dir":"Articles","previous_headings":"","what":"Adding interaction","title":"Choropleths","text":"next thing ’ll want make polygons highlight mouse passes . addPolygon() function highlight argument makes simple. (Leaflet.js tutorial also adds event handler zooms state ’s clicked. isn’t currently possible Leaflet R package, except either custom JavaScript using Shiny, outside scope example.)","code":"m %>% addPolygons( fillColor = ~pal(density), weight = 2, opacity = 1, color = \"white\", dashArray = \"3\", fillOpacity = 0.7, highlightOptions = highlightOptions( weight = 5, color = \"#666\", dashArray = \"\", fillOpacity = 0.7, bringToFront = TRUE)) #> Warning in sf::st_is_longlat(x): bounding box has potentially an invalid #> value range for longlat data"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"custom-info","dir":"Articles","previous_headings":"","what":"Custom info","title":"Choropleths","text":"Now let’s expose state names values user. Leaflet.js tutorial shows hovered-state’s information custom control. , ’s possible adding custom JavaScript using Shiny, example ’ll use built-labels feature instead. ’ll generate labels handcrafting HTML, passing lapply(htmltools::HTML) Leaflet knows treat label HTML instead plain text. ’ll also set label options improve style label element . final version polygon layer, let’s save result back m variable.","code":"labels <- sprintf( \"%s<\/strong>
    %g people / mi2<\/sup>\", states$name, states$density ) %>% lapply(htmltools::HTML) m <- m %>% addPolygons( fillColor = ~pal(density), weight = 2, opacity = 1, color = \"white\", dashArray = \"3\", fillOpacity = 0.7, highlightOptions = highlightOptions( weight = 5, color = \"#666\", dashArray = \"\", fillOpacity = 0.7, bringToFront = TRUE), label = labels, labelOptions = labelOptions( style = list(\"font-weight\" = \"normal\", padding = \"3px 8px\"), textsize = \"15px\", direction = \"auto\")) #> Warning in sf::st_is_longlat(x): bounding box has potentially an invalid #> value range for longlat data m"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"legend","dir":"Articles","previous_headings":"","what":"Legend","title":"Choropleths","text":"final step, let’s add legend. chose color map using colorBin(), addLegend() function makes particularly easy add legend correct colors intervals.","code":"m %>% addLegend(pal = pal, values = ~density, opacity = 0.7, title = NULL, position = \"bottomright\")"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"complete-code","dir":"Articles","previous_headings":"","what":"Complete code","title":"Choropleths","text":"","code":"# From https://leafletjs.com/examples/choropleth/us-states.js states <- sf::read_sf(\"https://rstudio.github.io/leaflet/json/us-states.geojson\") bins <- c(0, 10, 20, 50, 100, 200, 500, 1000, Inf) pal <- colorBin(\"YlOrRd\", domain = states$density, bins = bins) labels <- sprintf( \"%s<\/strong>
    %g people / mi2<\/sup>\", states$name, states$density ) %>% lapply(htmltools::HTML) leaflet(states) %>% setView(-96, 37.8, 4) %>% addProviderTiles(\"MapBox\", options = providerTileOptions( id = \"mapbox.light\", accessToken = Sys.getenv('MAPBOX_ACCESS_TOKEN'))) %>% addPolygons( fillColor = ~pal(density), weight = 2, opacity = 1, color = \"white\", dashArray = \"3\", fillOpacity = 0.7, highlightOptions = highlightOptions( weight = 5, color = \"#666\", dashArray = \"\", fillOpacity = 0.7, bringToFront = TRUE), label = labels, labelOptions = labelOptions( style = list(\"font-weight\" = \"normal\", padding = \"3px 8px\"), textsize = \"15px\", direction = \"auto\")) %>% addLegend(pal = pal, values = ~density, opacity = 0.7, title = NULL, position = \"bottomright\") #> Warning in sf::st_is_longlat(x): bounding box has potentially an invalid #> value range for longlat data"},{"path":"https://rstudio.github.io/leaflet/articles/colors.html","id":"common-parameters","dir":"Articles","previous_headings":"","what":"Common parameters","title":"Colors","text":"four color functions two required arguments, palette domain. palette argument specifies colors map data . argument can take one several forms: name preset palette RColorBrewer package, e.g., \"RdYlBu\", \"Accent\", \"Greens\". full name viridis palette: \"magma\", \"inferno\", \"plasma\", \"viridis\", \"cividis\", \"rocket\", \"mako\", \"turbo\". character vector RGB named colors, e.g., palette(), c(\"#000000\", \"#0000FF\", \"#FFFFFF\"), topo.colors(10). function receives single value 0 1 returns color, e.g.,: colorRamp(c(\"#000000\", \"#FFFFFF\"), interpolate=\"spline\") domain argument tells color function range input values. can pass NULL create palette function doesn’t preset range; range inferred data time invoke palette function. use palette function multiple times across different data, ’s important provide non-NULL value domain scaling data colors consistent.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/colors.html","id":"coloring-continuous-data","dir":"Articles","previous_headings":"Common parameters","what":"Coloring continuous data","title":"Colors","text":"’ve loaded shape data countries, including numeric field gdp_md_est contains GDP estimates.","code":"# From http://data.okfn.org/data/datasets/geo-boundaries-world-110m countries <- sf::read_sf(\"https://rstudio.github.io/leaflet/json/countries.geojson\") map <- leaflet(countries) par(mar = c(5,5,0,0), cex = 0.8) hist(countries$gdp_md_est, breaks = 20, main = \"\")"},{"path":"https://rstudio.github.io/leaflet/articles/colors.html","id":"continuous-input-continuous-colors-colornumeric","dir":"Articles","previous_headings":"Common parameters > Coloring continuous data","what":"Continuous input, continuous colors (colorNumeric)","title":"Colors","text":"Let’s start mapping GDP values directly \"Blues\" palette Color Brewer 2. ’ll use colorNumeric() create mapping function. \"Blues\" palette contains nine colors, colorNumeric() interpolates colors get continuous output. palette parameter ordered list colors map colors . case used Color Brewer palette, ’ve used c(\"white\", \"navy\") c(\"#FFFFFF\", \"#000080\") similar effect. can also pass two colors, diverging palette example. maximum flexibility, can even pass function takes numeric value interval [0,1] returns color. second parameter, domain, indicates set input values mapping colors. colorNumeric(), can provide either min/max example, set numbers colorNumeric() can call range() . result pal, function can accept numeric vectors values range range(countries$gdp_md_est) return colors \"#RRGGBB\" format.","code":"# Create a continuous palette function pal <- colorNumeric( palette = \"Blues\", domain = countries$gdp_md_est) # Apply the function to provide RGB colors to addPolygons map %>% addPolygons(stroke = FALSE, smoothFactor = 0.2, fillOpacity = 1, color = ~pal(gdp_md_est))"},{"path":"https://rstudio.github.io/leaflet/articles/colors.html","id":"continuous-input-discrete-colors-colorbin-and-colorquantile","dir":"Articles","previous_headings":"Common parameters > Coloring continuous data","what":"Continuous input, discrete colors (colorBin() and colorQuantile())","title":"Colors","text":"colorBin() maps numeric input data fixed number output colors using binning (slicing input domain value). can specify either exact breaks use, desired number bins. Note latter case, pretty = TRUE (default) ’ll end nice round breaks necessarily number bins wanted. colorQuantile() maps numeric input data fixed number output colors using quantiles (slicing input domain subsets equal numbers observations).","code":"binpal <- colorBin(\"Blues\", countries$gdp_md_est, 6, pretty = FALSE) map %>% addPolygons(stroke = FALSE, smoothFactor = 0.2, fillOpacity = 1, color = ~binpal(gdp_md_est)) qpal <- colorQuantile(\"Blues\", countries$gdp_md_est, n = 7) map %>% addPolygons(stroke = FALSE, smoothFactor = 0.2, fillOpacity = 1, color = ~qpal(gdp_md_est))"},{"path":"https://rstudio.github.io/leaflet/articles/colors.html","id":"coloring-categorical-data","dir":"Articles","previous_headings":"Common parameters","what":"Coloring categorical data","title":"Colors","text":"categorical data, use colorFactor(). palette contains number elements factor levels, mapping 1:1; otherwise, palette interpolated produce desired number colors. can specify input domain either passing factor character vector domain, providing levels directly using levels parameter (case domain ignored).","code":"# Make up some random levels. (TODO: Better example) countries$category <- factor(sample.int(5L, nrow(countries), TRUE)) factpal <- colorFactor(topo.colors(5), countries$category) leaflet(countries) %>% addPolygons(stroke = FALSE, smoothFactor = 0.2, fillOpacity = 1, color = ~factpal(category))"},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"functions-for-extending-leaflet","dir":"Articles","previous_headings":"","what":"Functions for extending leaflet","title":"Extending Leaflet","text":"Certain functions made available use code extending Leaflet.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"derivepointsderivepolygons","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"derivePoints/derivePolygons","title":"Extending Leaflet","text":"derivePoints() derivePolygons() can used extract point shape (polygon/line/circle/rectangle) data data.frame spatial object sf package. tries auto determine latitude/longitude colnames specified use user supplied column mappings.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"evalformula","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"evalFormula","title":"Extending Leaflet","text":"evalFormula() used evaluate formula given data return results. e.g., leaflet(.data.frame) %>% addMarkers(label=~name) internally uses evalFormula() calculate correct label values data using ~name formula.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"expandlimits","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"expandLimits","title":"Extending Leaflet","text":"can call expandLimits() make sure map’s view just enough show every point/shape data. way don’t determine exact bounds map.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"filternull","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"filterNULL","title":"Extending Leaflet","text":"Often passing list R JavaScript desirable remove null elements, ’s exactly filterNULL() .","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"getmapdata","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"getMapData","title":"Extending Leaflet","text":"getMapData() accesses data object passed calling leaflet() function.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"invokemethod","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"invokeMethod","title":"Extending Leaflet","text":"invokeMethod() glue R code JavaScript code. Requires corresponding method JavaScript side.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"example","dir":"Articles","previous_headings":"","what":"Example","title":"Extending Leaflet","text":"small example shows can integrate Bing.com basemap layer plugin","code":"library(leaflet) library(htmltools) library(htmlwidgets) bingPlugin <- htmlDependency( \"leaflet.plugins\", \"2.0.0\", src = normalizePath(\"./js\"), script = \"Bing.min.js\" ) registerPlugin <- function(map, plugin) { map$dependencies <- c(map$dependencies, list(plugin)) map } leaflet() %>% setView(-122.23, 37.75, zoom = 10) %>% registerPlugin(bingPlugin) %>% onRender(\"function(el, x) { var imagerySet = 'Aerial'; var bing = new L.BingLayer('LfO3DMI9S6GnXD7d0WGs~bq2DRVkmIAzSOFdodzZLvw~Arx8dclDxmZA0Y38tHIJlJfnMbGq5GXeYmrGOUIbS2VLFzRKCK0Yv_bAl6oe-DOc', {type: imagerySet}); this.addLayer(bing); }\")"},{"path":"https://rstudio.github.io/leaflet/articles/json.html","id":"reading-as-sf","dir":"Articles","previous_headings":"","what":"Reading as {sf}","title":"Working with GeoJSON & TopoJSON","text":"first approach use sf packages read GeoJSON/TopoJSON sf data.frames. , can use full functionality polygons, markers, colors, legends, etc. approach preferred using addGeoJSON()/addTopoJSON(), makes easy use feature properties determining map colors, labels, etc., modify add new properties. main downside approach supports feature collections features type, whereas GeoJSON/TopoJSON ’s possible—though uncommon—single feature collection contains, say, markers polygons.","code":"# From https://eric.clst.org/tech/usgeojson/ and # https://en.wikipedia.org/wiki/List_of_United_States_counties_and_county_equivalents nycounties <- sf::read_sf(\"https://rstudio.github.io/leaflet/json/nycounties.geojson\") pal <- colorNumeric(\"viridis\", NULL) leaflet(nycounties) %>% addTiles() %>% addPolygons(stroke = FALSE, smoothFactor = 0.3, fillOpacity = 1, fillColor = ~pal(log10(pop)), label = ~paste0(county, \": \", formatC(pop, big.mark = \",\"))) %>% addLegend(pal = pal, values = ~log10(pop), opacity = 1.0, labFormat = labelFormat(transform = function(x) round(10^x)))"},{"path":"https://rstudio.github.io/leaflet/articles/json.html","id":"working-with-raw-geojsontopojson","dir":"Articles","previous_headings":"","what":"Working with raw GeoJSON/TopoJSON","title":"Working with GeoJSON & TopoJSON","text":"addGeoJSON() addTopoJSON() accept GeoJSON data either parsed (nested lists) stringified (single-element character vector) format. Note larger JSON data, using parsed significantly slower using stringified, parsed data must go JSON encoding step. simple example using stringified data:","code":"topoData <- readLines(\"https://rstudio.github.io/leaflet/json/us-10m.json\") %>% paste(collapse = \"\\n\") leaflet() %>% setView(lng = -98.583, lat = 39.833, zoom = 3) %>% addTiles() %>% addTopoJSON(topoData, weight = 1, color = \"#444444\", fill = FALSE)"},{"path":"https://rstudio.github.io/leaflet/articles/json.html","id":"styling-raw-geojsontopojson","dir":"Articles","previous_headings":"","what":"Styling raw GeoJSON/TopoJSON","title":"Working with GeoJSON & TopoJSON","text":"can modify style GeoJSON/TopoJSON features ways. (Currently paths shapes can styled; marker styling supported.) One way apply styles features use arguments directly addGeoJSON()/addTopoJSON(). Another way encode styling information directly JSON object/string putting style object directly underneath top level JSON object. can provide feature-specific styles annotating feature’s property object style: {...} object. feature-specific styles highest precedence, top-level style object, finally style-related arguments passed function. See Leaflet’s path options available style properties. previous example demonstrated style arguments. involved example sets global styles per-feature styles directly JSON object. (approach recommended applying styling R; instead, use approach described convert sf first. However, control process generates GeoJSON first place, might use techniques put styling information directly JSON.)","code":"library(jsonlite) # From http://data.okfn.org/data/datasets/geo-boundaries-world-110m geojson <- readLines(\"https://rstudio.github.io/leaflet/json/countries.geojson\", warn = FALSE) %>% paste(collapse = \"\\n\") %>% fromJSON(simplifyVector = FALSE) # Default styles for all features geojson$style = list( weight = 1, color = \"#555555\", opacity = 1, fillOpacity = 0.8 ) # Gather GDP estimate from all countries gdp_md_est <- sapply(geojson$features, function(feat) { feat$properties$gdp_md_est }) # Gather population estimate from all countries pop_est <- sapply(geojson$features, function(feat) { max(1, feat$properties$pop_est) }) # Color by per-capita GDP using quantiles pal <- colorQuantile(\"Greens\", gdp_md_est / pop_est) # Add a properties$style list to each feature geojson$features <- lapply(geojson$features, function(feat) { feat$properties$style <- list( fillColor = pal( feat$properties$gdp_md_est / max(1, feat$properties$pop_est) ) ) feat }) # Add the now-styled GeoJSON object to the map leaflet() %>% addGeoJSON(geojson)"},{"path":"https://rstudio.github.io/leaflet/articles/leaflet.html","id":"introduction","dir":"Articles","previous_headings":"","what":"Introduction","title":"Introduction to leaflet","text":"Leaflet one popular open-source JavaScript libraries interactive maps. ’s used websites ranging New York Times Washington Post GitHub Flickr, well GIS specialists like OpenStreetMap, Mapbox, CartoDB. R package makes easy integrate control Leaflet maps R.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/leaflet.html","id":"features","dir":"Articles","previous_headings":"Introduction","what":"Features","title":"Introduction to leaflet","text":"Interactive panning/zooming Map tiles Markers Polygons Lines Popups GeoJSON Create maps right R console RStudio Embed maps knitr/R Markdown/Quarto documents, Shiny apps Easily render spatial objects sf package, data frames latitude/longitude columns Use map bounds mouse events drive Shiny logic Display maps non spherical Mercator projections Augment map features using chosen plugins leaflet plugins repository","code":""},{"path":"https://rstudio.github.io/leaflet/articles/leaflet.html","id":"installation","dir":"Articles","previous_headings":"Introduction","what":"Installation","title":"Introduction to leaflet","text":"install R package, run command R prompt: installed, can use package R console, within R Markdown documents, within Shiny applications.","code":"install.packages(\"leaflet\") # to install the development version from Github, run # devtools::install_github(\"rstudio/leaflet\")"},{"path":"https://rstudio.github.io/leaflet/articles/leaflet.html","id":"basic-usage","dir":"Articles","previous_headings":"Introduction","what":"Basic Usage","title":"Introduction to leaflet","text":"create Leaflet map basic steps: Create map widget calling leaflet(). Add layers (.e., features) map using layer functions (e.g., addTiles, addMarkers, addPolygons) modify map widget. Repeat step 2 desired. Print map widget display . ’s basic example: case ’re familiar pipe (magrittr base) operator (%>% / |>), equivalent without using pipes:","code":"library(leaflet) m <- leaflet() %>% addTiles() %>% # Add default OpenStreetMap map tiles addMarkers(lng=174.768, lat=-36.852, popup=\"The birthplace of R\") m # Print the map m <- leaflet() m <- addTiles(m) m <- addMarkers(m, lng=174.768, lat=-36.852, popup=\"The birthplace of R\") m"},{"path":"https://rstudio.github.io/leaflet/articles/leaflet.html","id":"next-steps","dir":"Articles","previous_headings":"Introduction","what":"Next Steps","title":"Introduction to leaflet","text":"highly recommend proceed Map Widget page exploring rest site, describes common idioms ’ll use throughout examples pages. Although tried provide R-like interface Leaflet, may want check API documentation Leaflet occasionally meanings certain parameters clear .","code":""},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"data-sources","dir":"Articles","previous_headings":"","what":"Data sources","title":"Add markers to leaflet","text":"Point data markers can come variety sources: POINT, sfc_POINT, sf objects (sf package); X Y dimensions considered Two-column numeric matrices (first column longitude, second latitude) Data frame latitude longitude columns. can explicitly tell marker function columns contain coordinate data (e.g., addMarkers(lng = ~Longitude, lat = ~Latitude)), let function look columns named lat/latitude lon/lng/long/longitude (case insensitive). Simply provide numeric vectors lng lat arguments Note MULTIPOINT objects sf supported time.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"icon-markers","dir":"Articles","previous_headings":"","what":"Icon Markers","title":"Add markers to leaflet","text":"Icon markers added using addMarkers() addAwesomeMarkers() functions. default appearance dropped pin. layer functions, popup argument can used add message displayed click, label option can used display text label either hover statically.","code":"data(quakes) # Show first 20 rows from the `quakes` dataset leaflet(data = quakes[1:20,]) %>% addTiles() %>% addMarkers(~long, ~lat, popup = ~as.character(mag), label = ~as.character(mag))"},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"customizing-marker-icons","dir":"Articles","previous_headings":"Icon Markers","what":"Customizing Marker Icons","title":"Add markers to leaflet","text":"can provide custom markers one several ways, depending scenario. ways, icon can provided either URL file path. simple case applying single icon set markers, use makeIcon(). several icons apply vary couple parameters (.e., share size anchor points different URLs), use icons() icons() performs similarly data.frame(), arguments shorter number markers recycled fit. Finally, set icons vary multiple parameters, may convenient use iconList(). lets create list (named unnamed) makeIcon() icons, select list position name.","code":"greenLeafIcon <- makeIcon( iconUrl = \"https://leafletjs.com/examples/custom-icons/leaf-green.png\", iconWidth = 38, iconHeight = 95, iconAnchorX = 22, iconAnchorY = 94, shadowUrl = \"https://leafletjs.com/examples/custom-icons/leaf-shadow.png\", shadowWidth = 50, shadowHeight = 64, shadowAnchorX = 4, shadowAnchorY = 62 ) leaflet(data = quakes[1:4,]) %>% addTiles() %>% addMarkers(~long, ~lat, icon = greenLeafIcon) quakes1 <- quakes[1:10,] leafIcons <- icons( iconUrl = ifelse(quakes1$mag < 4.6, \"https://leafletjs.com/examples/custom-icons/leaf-green.png\", \"https://leafletjs.com/examples/custom-icons/leaf-red.png\" ), iconWidth = 38, iconHeight = 95, iconAnchorX = 22, iconAnchorY = 94, shadowUrl = \"https://leafletjs.com/examples/custom-icons/leaf-shadow.png\", shadowWidth = 50, shadowHeight = 64, shadowAnchorX = 4, shadowAnchorY = 62 ) leaflet(data = quakes1) %>% addTiles() %>% addMarkers(~long, ~lat, icon = leafIcons) # Make a list of icons. We'll index into it based on name. oceanIcons <- iconList( ship = makeIcon( \"https://upload.wikimedia.org/wikipedia/commons/thumb/0/0b/Maki2-ferry-18.svg/480px-Maki2-ferry-18.svg.png\", \"https://upload.wikimedia.org/wikipedia/commons/thumb/0/0b/Maki2-ferry-18.svg/18px-Maki2-ferry-18.svg.png\", 18, 18 ), pirate = makeIcon( \"https://upload.wikimedia.org/wikipedia/commons/thumb/c/c3/Maki2-danger-24.svg/240px-Maki2-danger-24.svg.png\", \"https://upload.wikimedia.org/wikipedia/commons/thumb/c/c3/Maki2-danger-24.svg/24px-Maki2-danger-24.svg.png\", 24, 24 ) ) # Some fake data df <- sf::st_as_sf( data.frame( type = factor(ifelse(runif(20) > 0.75, \"pirate\", \"ship\"), c(\"ship\", \"pirate\")), lng = (runif(20) - .5) * 10 - 90.620130, lat = (runif(20) - .5) * 3.8 + 25.638077 ), coords = c(\"lng\", \"lat\"), crs = 4326 ) leaflet(df) %>% addTiles() %>% # Select from oceanIcons based on df$type addMarkers(icon = ~oceanIcons[type])"},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"awesome-icons","dir":"Articles","previous_headings":"Icon Markers","what":"Awesome Icons","title":"Add markers to leaflet","text":"Leaflet supports even customizable markers using awesome markers leaflet plugin. addAwesomeMarkers() function similar addMarkers() function additionally allows specify custom colors markers well icons Font Awesome, Bootstrap Glyphicons, Ion icons icon libraries. Similar makeIcon(), icons(), iconList() described , makeAwesomeIcon(), awesomeIcons() awesomeIconList() functions, enable add awesome icons. library argument one ‘ion’, ‘fa’, ‘glyphicon’. icon argument needs name valid icon supported respective library (w/o prefix library name).","code":"# first 20 quakes df.20 <- quakes[1:20,] getColor <- function(quakes) { sapply(quakes$mag, function(mag) { if(mag <= 4) { \"green\" } else if(mag <= 5) { \"orange\" } else { \"red\" } }) } icons <- awesomeIcons( icon = 'ios-close', iconColor = 'black', library = 'ion', markerColor = getColor(df.20) ) leaflet(df.20) %>% addTiles() %>% addAwesomeMarkers(~long, ~lat, icon=icons, label=~as.character(mag))"},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"marker-clusters","dir":"Articles","previous_headings":"Icon Markers","what":"Marker Clusters","title":"Add markers to leaflet","text":"large number markers map, can cluster using Leaflet.markercluster plug-. enable plug-, can provide list options argument clusterOptions, e.g., Using freezeAtZoom argument markerClusterOptions(), can set clustering freeze specific zoom level. example markerClusterOptions(freezeAtZoom = 5) freeze cluster zoom level 5 regardless user’s actual zoom level.","code":"leaflet(quakes) %>% addTiles() %>% addMarkers( clusterOptions = markerClusterOptions() )"},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"circle-markers","dir":"Articles","previous_headings":"","what":"Circle Markers","title":"Add markers to leaflet","text":"Circle markers much like regular circles (see Lines Shapes), except radius onscreen pixels stays constant regardless zoom level. can use default appearance: customize color, radius, stroke, opacity, etc.","code":"leaflet(df) %>% addTiles() %>% addCircleMarkers() # Create a palette that maps factor levels to colors pal <- colorFactor(c(\"navy\", \"red\"), domain = c(\"ship\", \"pirate\")) leaflet(df) %>% addTiles() %>% addCircleMarkers( radius = ~ifelse(type == \"ship\", 6, 10), color = ~pal(type), stroke = FALSE, fillOpacity = 0.5 )"},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"add-ons","dir":"Articles","previous_headings":"","what":"Add-ons","title":"Additional features","text":"various utility functions can use augment map additional elements. utility function give supports options customization, sure check help files details.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"leaflet-measure","dir":"Articles","previous_headings":"Add-ons","what":"Leaflet Measure","title":"Additional features","text":"can use addMeasure() add leaflet-measure plugin map. Use various options customize appearance behavior plugin (see ?addMeasure details).","code":"library(leaflet) m <- leaflet() %>% addTiles() m %>% # Central Park fitBounds(-73.9, 40.75, -73.95,40.8) %>% addMeasure() m %>% # Berlin, Germany fitBounds(13.76134, 52.675499, 13.0884, 52.33812) %>% addMeasure( position = \"bottomleft\", primaryLengthUnit = \"meters\", primaryAreaUnit = \"sqmeters\", activeColor = \"#3D535D\", completedColor = \"#7D4479\")"},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"graticule","dir":"Articles","previous_headings":"Add-ons","what":"Graticule","title":"Additional features","text":"Use addGraticule() add graticule (grid) map (via Leaflet.Graticule plugin). can use group argument make graticule toggleable.","code":"library(leaflet) m <- leaflet() %>% addTiles() %>% setView(0,0,2) m %>% addGraticule() m %>% addGraticule(interval = 40, style = list(color = \"#FF0000\", weight = 1)) m %>% addGraticule(group = \"Graticule\") %>% addLayersControl(overlayGroups = c(\"Graticule\"), options = layersControlOptions(collapsed = FALSE))"},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"terminator-daynight-indicator","dir":"Articles","previous_headings":"Add-ons","what":"Terminator (day/night indicator)","title":"Additional features","text":"","code":"library(leaflet) # Default Resolution leaflet() %>% addTiles() %>% addTerminator() # Custom Resolution + Custom Date and on a toggleable Layer leaflet() %>% addTiles() %>% addTerminator( resolution=10, time = \"2013-06-20T21:00:00Z\", group = \"daylight\") %>% addLayersControl( overlayGroups = \"daylight\", options = layersControlOptions(collapsed = FALSE))"},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"minimap","dir":"Articles","previous_headings":"Add-ons","what":"Minimap","title":"Additional features","text":"can use addMiniMap() add minimap aid navigation. implemented via Leaflet-MiniMap plugin. Note minimap shows map tiles; markers, polygons, layers main map displayed minimap. can use specific basemap minimap via tiles parameter. example also allows minimap hidden setting toggleDisplay = TRUE.","code":"library(leaflet) l <- leaflet() %>% setView(0,0,3) l %>% addProviderTiles(providers$Esri.WorldStreetMap) %>% addMiniMap() l %>% addProviderTiles(providers$Esri.WorldStreetMap) %>% addMiniMap( tiles = providers$Esri.WorldStreetMap, toggleDisplay = TRUE)"},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"easybutton","dir":"Articles","previous_headings":"Add-ons","what":"EasyButton","title":"Additional features","text":"Use addEasyButton() add simple buttons (via Leaflet.EasyButton) trigger custom JavaScript logic. map adds two buttons: one sets map zoom level 1, attempts locate . next example demonstrates easyButton two distinct states: frozen-markers unfrozen-markers, distinct icon, title, click handler.","code":"library(leaflet) library(htmltools) library(htmlwidgets) leaflet() %>% addTiles() %>% addEasyButton(easyButton( icon=\"fa-globe\", title=\"Zoom to Level 1\", onClick=JS(\"function(btn, map){ map.setZoom(1); }\"))) %>% addEasyButton(easyButton( icon=\"fa-crosshairs\", title=\"Locate Me\", onClick=JS(\"function(btn, map){ map.locate({setView: true}); }\"))) leaflet() %>% addTiles() %>% addMarkers(data=quakes, clusterOptions = markerClusterOptions(), clusterId = \"quakesCluster\") %>% addEasyButton(easyButton( states = list( easyButtonState( stateName=\"unfrozen-markers\", icon=\"ion-toggle\", title=\"Freeze Clusters\", onClick = JS(\" function(btn, map) { var clusterManager = map.layerManager.getLayer('cluster', 'quakesCluster'); clusterManager.freezeAtZoom(); btn.state('frozen-markers'); }\") ), easyButtonState( stateName=\"frozen-markers\", icon=\"ion-toggle-filled\", title=\"UnFreeze Clusters\", onClick = JS(\" function(btn, map) { var clusterManager = map.layerManager.getLayer('cluster', 'quakesCluster'); clusterManager.unfreeze(); btn.state('unfrozen-markers'); }\") ) ) ))"},{"path":[]},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"custom-javascript-with-htmlwidgetsonrender","dir":"Articles","previous_headings":"Advanced Features","what":"Custom JavaScript with htmlwidgets::onRender()","title":"Additional features","text":"htmlwidgets::onRender() can used add custom behavior leaflet map using native JavaScript. advanced use case requires know JavaScript. Using onRender can customize map’s behavior using APIs defined Leaflet.js documentation. example sync base layer mini-map baselayer main map, using ‘baselayerchange’ event.","code":"l <- leaflet() %>% setView(0,0,3) esri <- grep(\"^Esri\", providers, value = TRUE) for (provider in esri) { l <- l %>% addProviderTiles(provider, group = provider) } l %>% addLayersControl(baseGroups = names(esri), options = layersControlOptions(collapsed = FALSE)) %>% addMiniMap(tiles = esri[[1]], toggleDisplay = TRUE, position = \"bottomleft\") %>% htmlwidgets::onRender(\" function(el, x) { var myMap = this; myMap.on('baselayerchange', function (e) { myMap.minimap.changeLayer(L.tileLayer.provider(e.name)); }) }\")"},{"path":"https://rstudio.github.io/leaflet/articles/popups.html","id":"popups","dir":"Articles","previous_headings":"","what":"Popups","title":"Popups and Labels","text":"Popups small boxes containing arbitrary HTML, point specific point map. Use addPopups() function add standalone popup map. common use popups appear markers shapes clicked. Marker shape functions Leaflet package take popup argument, can pass HTML easily attach simple popup. preceding example, htmltools::htmlEscape() used sanitize characters name might interpreted HTML. wasn’t necessary example (restaurant names contained HTML markup), important situation data may come file database, user. addition markers can also add popups shapes like lines, circles polygons.","code":"content <- paste(sep = \"
    \", \"Samurai Noodle<\/a><\/b>\", \"606 5th Ave. S\", \"Seattle, WA 98138\" ) leaflet() %>% addTiles() %>% addPopups(-122.327298, 47.597131, content, options = popupOptions(closeButton = FALSE) ) library(htmltools) df <- read.csv(textConnection( \"Name,Lat,Long Samurai Noodle,47.597131,-122.327298 Kukai Ramen,47.6154,-122.327157 Tsukushinbo,47.59987,-122.326726\" )) leaflet(df) %>% addTiles() %>% addMarkers(~Long, ~Lat, popup = ~htmlEscape(Name))"},{"path":"https://rstudio.github.io/leaflet/articles/popups.html","id":"labels","dir":"Articles","previous_headings":"","what":"Labels","title":"Popups and Labels","text":"label textual HTML content can attached markers shapes always displayed displayed mouse . Unlike popups don’t need click marker/polygon label shown.","code":"library(htmltools) df <- read.csv(textConnection( \"Name,Lat,Long Samurai Noodle,47.597131,-122.327298 Kukai Ramen,47.6154,-122.327157 Tsukushinbo,47.59987,-122.326726\")) leaflet(df) %>% addTiles() %>% addMarkers(~Long, ~Lat, label = ~htmlEscape(Name))"},{"path":"https://rstudio.github.io/leaflet/articles/popups.html","id":"customizing-marker-labels","dir":"Articles","previous_headings":"Labels","what":"Customizing Marker Labels","title":"Popups and Labels","text":"can customize marker labels using labelOptions argument addMarkers() function. labelOptions argument can populated using labelOptions() function. noHide false (default) label displayed hover mouse marker; noHide set true label always displayed.","code":"# Change Text Size and text Only and also a custom CSS leaflet() %>% addTiles() %>% setView(-118.456554, 34.09, 13) %>% addMarkers( lng = -118.456554, lat = 34.105, label = \"Default Label\", labelOptions = labelOptions(noHide = TRUE)) %>% addMarkers( lng = -118.456554, lat = 34.095, label = \"Label w/o surrounding box\", labelOptions = labelOptions(noHide = TRUE, textOnly = TRUE)) %>% addMarkers( lng = -118.456554, lat = 34.085, label = \"label w/ textsize 15px\", labelOptions = labelOptions(noHide = TRUE, textsize = \"15px\")) %>% addMarkers( lng = -118.456554, lat = 34.075, label = \"Label w/ custom CSS style\", labelOptions = labelOptions(noHide = TRUE, direction = \"bottom\", style = list( \"color\" = \"red\", \"font-family\" = \"serif\", \"font-style\" = \"italic\", \"box-shadow\" = \"3px 3px rgba(0,0,0,0.25)\", \"font-size\" = \"12px\", \"border-color\" = \"rgba(0,0,0,0.5)\" )))"},{"path":"https://rstudio.github.io/leaflet/articles/popups.html","id":"labels-without-markers","dir":"Articles","previous_headings":"Labels","what":"Labels without markers","title":"Popups and Labels","text":"can create labels without accompanying markers using addLabelOnlyMarkers() function.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/projections.html","id":"defining-a-custom-crs","dir":"Articles","previous_headings":"","what":"Defining a custom CRS","title":"Working with projections in Leaflet","text":"’ve decided custom projection, map tiles match (necessary), can use leafletCRS() create custom projection. crsClass parameter lets specify JavaScript constructor use generate Leaflet.js CRS object. case, ’re using L.Proj.CRS, class comes Proj4Leaflet. (specific list CRS classes can used ; see ?leafletCRS details.) code parameter CRS identifier, usually EPSG identifier similar. (part, doesn’t affect us, can treat like documentation; ’s primarily used Proj4Leaflet purposes don’t apply R package.) proj4def parameter either PROJ.4 WKT string defines CRS. don’t know PROJ.4 WKT string, can generally find epsg.io spatialreference.org. resulting object can passed leaflet function via parameter crs = leafletOptions(crs = ...).","code":"crs <- leafletCRS(crsClass = \"L.Proj.CRS\", code = \"ESRI:102003\", proj4def = \"+proj=aea +lat_1=29.5 +lat_2=45.5 +lat_0=37.5 +lon_0=-96 +x_0=0 +y_0=0 +datum=WGS84 +units=m +no_defs\", resolutions = 1.5^(25:15))"},{"path":"https://rstudio.github.io/leaflet/articles/projections.html","id":"displaying-basemap-tiles-with-custom-projections","dir":"Articles","previous_headings":"","what":"Displaying basemap tiles with custom projections","title":"Working with projections in Leaflet","text":"example shows Gothenberg, Sweden EPSG:3006 (SWEREF99 TM) projection. , ’s critical use basemap tiles projection specified leafletCRS(). case api.geosition.com server indeed uses EPSG:3006 tiles. can render similar map default EPSG:3857 projection comparison. custom projection worked correctly, markers appear position.","code":"epsg3006 <- leafletCRS(crsClass = \"L.Proj.CRS\", code = \"EPSG:3006\", proj4def = \"+proj=utm +zone=33 +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs\", resolutions = 2^(13:-1), # 8192 down to 0.5 origin = c(0, 0) ) tile_url <- \"http://api.geosition.com/tile/osm-bright-3006/{z}/{x}/{y}.png\" tile_attrib <- \"Map data © OpenStreetMap contributors<\/a>, Imagery © 2013 Kartena<\/a>\" leaflet(options = leafletOptions(worldCopyJump = FALSE, crs = epsg3006)) %>% setView(11.965053, 57.70451, 13) %>% addTiles(urlTemplate = tile_url, attribution = tile_attrib, options = tileOptions(minZoom = 0, maxZoom = 14, continuousWorld = TRUE)) %>% addMarkers(11.965053, 57.70451) leaflet() %>% setView(11.965053, 57.70451, 16) %>% addTiles() %>% addMarkers(11.965053, 57.70451)"},{"path":"https://rstudio.github.io/leaflet/articles/projections.html","id":"displaying-shapes-with-custom-projections","dir":"Articles","previous_headings":"","what":"Displaying shapes with custom projections","title":"Working with projections in Leaflet","text":"tiles must projection used leafletCRS(), must always use WGS 84 longitude/latitude data markers, circles, polygons, lines. Leaflet automatically project coordinates displaying. example uses data rnaturalearth package projects EPSG:9311 (US National Atlas Equal Area) coordinate system. Compare first map, uses default CRS, second map, reprojected.","code":"north_america <- rnaturalearth::countries110 |> dplyr::filter(CONTINENT == \"North America\") epsg9311 <- leafletCRS( crsClass = \"L.Proj.CRS\", code = \"EPSG:9311\", proj4def = \"+proj=laea +lat_0=45 +lon_0=-100 +x_0=0 +y_0=0 +a=6370997 +b=6370997 +units=m +no_defs\", resolutions = 2 ^ (16:7) ) pal <- leaflet::colorNumeric(palette = \"viridis\", domain = north_america$POP_EST) plot_na_map <- function(opts = leafletOptions()) { leaflet(north_america, options = opts) %>% addPolygons( weight = 1, color = \"#444444\", opacity = 1, fillColor = ~ pal(POP_EST), fillOpacity = 0.7, smoothFactor = 0.5, label = ~ paste(SOVEREIGNT, POP_EST), labelOptions = labelOptions(direction = \"auto\") ) } plot_na_map() plot_na_map(opts = leafletOptions(crs = epsg9311))"},{"path":"https://rstudio.github.io/leaflet/articles/projections.html","id":"polar-projections","dir":"Articles","previous_headings":"","what":"Polar projections","title":"Working with projections in Leaflet","text":"’s possible use polar projections, though may encounter even problems incompatibilities Leaflet.js plugins using types custom projections.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/raster.html","id":"large-raster-warning","dir":"Articles","previous_headings":"","what":"Large Raster Warning","title":"Raster Images","text":"addRasterImage() embeds image map widget, increase size generated HTML proportionally. order avoid unacceptable download times memory usage, addRasterImage() error PNG beyond size indicated maxBytes argument (defaults 4 megabytes). large raster layer, can provide larger number bytes see goes, use terra::resample() decrease number cells.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/raster.html","id":"projection-performance","dir":"Articles","previous_headings":"","what":"Projection Performance","title":"Raster Images","text":"addRasterImage() projects using terra::project(), can take smallest rasters. large raster layer expect call addRasterImage() raster layer many times, can perform EPSG:3857 projection (either using leaflet::projectRasterForLeaflet() using another GIS library program) call addRasterImage() project = FALSE. sure pre-projected raster layer tagged accurate extent CRS, values still needed place image proper position map.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/raster.html","id":"coloring","dir":"Articles","previous_headings":"","what":"Coloring","title":"Raster Images","text":"order render raster object image, cell value must converted RGB() color. can specify color scale using colors argument, accepts variety color specifications: name Color Brewer 2 palette. colors argument provided, \"Spectral\" default. vector represents ordered list colors map data. color specification accepted grDevices::col2rgb() can used, including \"#RRGGBB\" \"#RRGGBBAA\" forms. Example: colors = c(\"#E0F3DB\", \"#A8DDB5\", \"#43A2CA\"). color scaling function, like detailed Colors topic. example: colors = colorBin(\"Greens\", domain = NULL, bins = 5, na.color = \"transparent\").","code":""},{"path":"https://rstudio.github.io/leaflet/articles/raster.html","id":"example","dir":"Articles","previous_headings":"","what":"Example","title":"Raster Images","text":"","code":"library(terra) library(leaflet) # you can download by accessing https://rstudio.github.io/leaflet/nc/oisst-sst.nc r <- rast(\"nc/oisst-sst.nc\") pal <- colorNumeric(c(\"#0C2C84\", \"#41B6C4\", \"#FFFFCC\"), values(r), na.color = \"transparent\") leaflet() %>% addTiles() %>% addRasterImage(r, colors = pal, opacity = 0.8) %>% addLegend(pal = pal, values = values(r), title = \"Surface temp\")"},{"path":"https://rstudio.github.io/leaflet/articles/shapes.html","id":"polygons-and-polylines","dir":"Articles","previous_headings":"","what":"Polygons and Polylines","title":"Lines and Shapes","text":"Line polygon data can come variety sources: MULTIPOLYGON, POLYGON, MULTILINESTRING, LINESTRING objects (sf package) map objects (maps::map()); use map(fill = TRUE) polygons, FALSE polylines Two-column numeric matrix; first column longitude second latitude. Polygons separated rows (NA, NA). possible represent multi-polygons polygons holes using method; use sf::st_polygon() instead.","code":"# From https://www.census.gov/geo/maps-data/data/cbf/cbf_state.html states <- sf::read_sf(\"shp/cb_2013_us_state_20m.shp\", layer = \"cb_2013_us_state_20m\") neStates <- subset(states, states$STUSPS %in% c( \"CT\",\"ME\",\"MA\",\"NH\",\"RI\",\"VT\",\"NY\",\"NJ\",\"PA\" )) leaflet(neStates) %>% addPolygons(color = \"#444444\", weight = 1, smoothFactor = 0.5, opacity = 1.0, fillOpacity = 0.5, fillColor = ~colorQuantile(\"YlOrRd\", ALAND)(ALAND), highlightOptions = highlightOptions(color = \"white\", weight = 2, bringToFront = TRUE))"},{"path":"https://rstudio.github.io/leaflet/articles/shapes.html","id":"highlighting-shapes","dir":"Articles","previous_headings":"Polygons and Polylines","what":"Highlighting shapes","title":"Lines and Shapes","text":"example uses highlightOptions parameter emphasize currently moused-polygon. (bringToFront = TRUE argument necessary prevent thicker, white border active polygon hidden behind borders polygons happen higher z-order.) can use highlightOptions shape layers described page.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/shapes.html","id":"simplifying-complex-polygonspolylines","dir":"Articles","previous_headings":"Polygons and Polylines","what":"Simplifying complex polygons/polylines","title":"Lines and Shapes","text":"detailed (.e., large) shape data can present problem Leafet, since eventually passed browser rendered SVG, expressive convenient scalability limits. cases, consider using rmapshaper::ms_simplify(), topology-preserving simplification conveniently R.","code":"fullsize <- rnaturalearth::countries110 object.size(fullsize) simplified <- rmapshaper::ms_simplify(fullsize) object.size(simplified)"},{"path":"https://rstudio.github.io/leaflet/articles/shapes.html","id":"circles","dir":"Articles","previous_headings":"","what":"Circles","title":"Lines and Shapes","text":"Circles added using addCircles(). Circles similar circle markers; difference circles radii specified meters, circle markers specified pixels. result, circles scaled map user zooms , circle markers remain constant size screen regardless zoom level. plotting circles, circle centers (radii) required, set valid data sources different polygons markers. See introduction Markers specifics.","code":"cities <- read.csv(textConnection(\" City,Lat,Long,Pop Boston,42.3601,-71.0589,645966 Hartford,41.7627,-72.6743,125017 New York City,40.7127,-74.0059,8406000 Philadelphia,39.9500,-75.1667,1553000 Pittsburgh,40.4397,-79.9764,305841 Providence,41.8236,-71.4222,177994 \")) leaflet(cities) %>% addTiles() %>% addCircles(lng = ~Long, lat = ~Lat, weight = 1, radius = ~sqrt(Pop) * 30, popup = ~City )"},{"path":"https://rstudio.github.io/leaflet/articles/shapes.html","id":"rectangles","dir":"Articles","previous_headings":"","what":"Rectangles","title":"Lines and Shapes","text":"Rectangles added using addRectangles() function. takes lng1, lng2, lat1, lat2 vector arguments define corners rectangles. arguments always required; rectangle geometry inferred data object.","code":"leaflet() %>% addTiles() %>% addRectangles( lng1=-118.456554, lat1=34.078039, lng2=-118.436383, lat2=34.062717, fillColor = \"transparent\" )"},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"modifying-existing-maps-with-leafletproxy","dir":"Articles","previous_headings":"","what":"Modifying Existing Maps with leafletProxy","title":"Using Leaflet with Shiny","text":"works, reactive inputs expressions affect renderLeaflet() expression cause entire map redrawn scratch reset map position zoom level. situations may acceptable desirable behavior. situations, may want finer-grained control map, changing color single polygon adding marker point click – without redrawing entire map. modify map ’s already running page, use leafletProxy() function place leaflet() call, otherwise use Leaflet function calls normal. Normally use leaflet create static aspects map, leafletProxy() manage dynamic elements, like : Besides adding layers, can set map bounds, remove specific objects ID, clear categories layers.","code":"library(shiny) library(leaflet) library(RColorBrewer) ui <- bootstrapPage( tags$style(type = \"text/css\", \"html, body {width:100%;height:100%}\"), leafletOutput(\"map\", width = \"100%\", height = \"100%\"), absolutePanel(top = 10, right = 10, sliderInput(\"range\", \"Magnitudes\", min(quakes$mag), max(quakes$mag), value = range(quakes$mag), step = 0.1 ), selectInput(\"colors\", \"Color Scheme\", rownames(subset(brewer.pal.info, category %in% c(\"seq\", \"div\"))) ), checkboxInput(\"legend\", \"Show legend\", TRUE) ) ) server <- function(input, output, session) { # Reactive expression for the data subsetted to what the user selected filteredData <- reactive({ quakes[quakes$mag >= input$range[1] & quakes$mag <= input$range[2],] }) # This reactive expression represents the palette function, # which changes as the user makes selections in UI. colorpal <- reactive({ colorNumeric(input$colors, quakes$mag) }) output$map <- renderLeaflet({ # Use leaflet() here, and only include aspects of the map that # won't need to change dynamically (at least, not unless the # entire map is being torn down and recreated). leaflet(quakes) %>% addTiles() %>% fitBounds(~min(long), ~min(lat), ~max(long), ~max(lat)) }) # Incremental changes to the map (in this case, replacing the # circles when a new color is chosen) should be performed in # an observer. Each independent set of things that can change # should be managed in its own observer. observe({ pal <- colorpal() leafletProxy(\"map\", data = filteredData()) %>% clearShapes() %>% addCircles(radius = ~10^mag/10, weight = 1, color = \"#777777\", fillColor = ~pal(mag), fillOpacity = 0.7, popup = ~paste(mag) ) }) # Use a separate observer to recreate the legend as needed. observe({ proxy <- leafletProxy(\"map\", data = quakes) # Remove any existing legend, and only if the legend is # enabled, create a new one. proxy %>% clearControls() if (input$legend) { pal <- colorpal() proxy %>% addLegend(position = \"bottomright\", pal = pal, values = ~mag ) } }) } shinyApp(ui, server) proxy <- leafletProxy(\"mymap\") # Fit the view to within these bounds (can also use setView) proxy %>% fitBounds(0, 0, 11, 11) # Create circles with layerIds of \"A\", \"B\", \"C\"... proxy %>% addCircles(1:10, 1:10, layerId = LETTERS[1:10]) # Remove some of the circles proxy %>% removeShape(c(\"B\", \"F\")) # Clear all circles (and other shapes) proxy %>% clearShapes()"},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"understanding-layer-ids","dir":"Articles","previous_headings":"","what":"Understanding Layer IDs","title":"Using Leaflet with Shiny","text":"Layer IDs can used replace remove specific map elements. (Note: managing groups map elements, see Show/Hide Layers topic.) give object layer ID, similar object exists ID, removed map new object added. layer-adding functions take layerId argument. Generally vectorized argument; adding 50 polygons, ’ll need pass either NULL 50-element character vector layerId value. (use single-element character vector layerId, 50 polygons ID, last polygon removed; don’t !) Layer IDs namespaced category. Layer IDs need unique within category; call addCircles() cause tile layers removed, regardless layer ID, circles tiles different categories.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"inputsevents","dir":"Articles","previous_headings":"","what":"Inputs/Events","title":"Using Leaflet with Shiny","text":"Leaflet maps objects send input values (’ll refer “events” document) Shiny user interacts .","code":""},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"object-events","dir":"Articles","previous_headings":"Inputs/Events","what":"Object events","title":"Using Leaflet with Shiny","text":"Object event names generally use pattern: input$MAPID_OBJCATEGORY_EVENTNAME leafletOutput(\"mymap\") circle , clicking circle update Shiny input input$mymap_shape_click. (Note layer ID part name, though part value.) shape ever clicked map, input$mymap_shape_click null. Valid values OBJCATEGORY marker, shape, geojson, topojson. (Tiles controls don’t raise mouse events.) Valid values EVENTNAME click, mouseover, mouseout. events set either NULL event never happened, list() includes: lat - latitude object, available; otherwise, mouse cursor lng - longitude object, available; otherwise, mouse cursor id - layerId, GeoJSON events also include additional properties: featureId - feature ID, properties - feature properties","code":""},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"map-events","dir":"Articles","previous_headings":"Inputs/Events","what":"Map events","title":"Using Leaflet with Shiny","text":"map also input values/events. input$MAPID_click event sent map background basemap clicked. value list lat lng. input$MAPID_bounds provides latitude/longitude bounds currently visible map area; value list() named elements north, east, south, west. input$MAPID_zoom integer indicates zoom level. input$MAPID_center provides latitude/longitude center currently visible map area; value list() named elements lat lng.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"putting-it-all-together","dir":"Articles","previous_headings":"","what":"Putting it all together","title":"Using Leaflet with Shiny","text":"extensive example Shiny Leaflet working together, take look SuperZip Explorer example app (note “Get Code” button top page). (Hint: Try clicking bubbles, also notice plots sidebar change pan zoom around map.)","code":""},{"path":"https://rstudio.github.io/leaflet/articles/showhide.html","id":"understanding-groups","dir":"Articles","previous_headings":"","what":"Understanding Groups","title":"Show/Hide Layers","text":"group label given set layers. assign layers groups using group parameter adding layers map. Many layers can belong group. layer can belong zero one groups (can’t assign layer two groups). Groups Layer IDs may appear similar, used assign name layer. However, differ layer IDs used provide unique identifier individual markers shapes, etc., groups used give shared labels many items. generally provide one group value entire addMarkers() call, can reuse group value future add*() calls add group’s membership (example ). layerId arguments always vectorized: calling e.g., addMarkers() need provide one layer ID per marker, must unique. add circle layer ID \"foo\" later add different shape layer ID, original circle removed.","code":"leaflet() %>% addTiles() %>% addMarkers(data = coffee_shops, group = \"Food & Drink\") %>% addMarkers(data = restaurants, group = \"Food & Drink\") %>% addMarkers(data = restrooms, group = \"Restrooms\")"},{"path":"https://rstudio.github.io/leaflet/articles/showhide.html","id":"interactive-layer-display","dir":"Articles","previous_headings":"","what":"Interactive Layer Display","title":"Show/Hide Layers","text":"can use Leaflet’s layers control feature allow users toggle visibility groups. addLayersControl() distinguishes base groups, can viewed one group time, overlay groups, can individually checked unchecked. Although base groups generally tile layers, overlay groups usually markers shapes, restriction types layers can placed category. one layers control can present map time. call addLayersControl() multiple times, last call win.","code":"outline <- quakes[chull(quakes$long, quakes$lat),] map <- leaflet(quakes) %>% # Base groups addTiles(group = \"OSM (default)\") %>% addProviderTiles(providers$CartoDB.Positron, group = \"Positron (minimal)\") %>% addProviderTiles(providers$Esri.WorldImagery, group = \"World Imagery (satellite)\") %>% # Overlay groups addCircles( ~ long, ~ lat, ~ 10 ^ mag / 5, stroke = FALSE, group = \"Quakes\", fillColor = \"tomato\" ) %>% addPolygons( data = outline, lng = ~ long, lat = ~ lat, fill = FALSE, weight = 2, color = \"#FFFFCC\", group = \"Outline\" ) %>% # Layers control addLayersControl( baseGroups = c( \"OSM (default)\", \"Positron (minimal)\", \"World Imagery (satellite)\" ), overlayGroups = c(\"Quakes\", \"Outline\"), options = layersControlOptions(collapsed = FALSE) ) map"},{"path":"https://rstudio.github.io/leaflet/articles/showhide.html","id":"programmatic-layer-display","dir":"Articles","previous_headings":"","what":"Programmatic Layer Display","title":"Show/Hide Layers","text":"can use showGroup() hideGroup() show hide groups code. mostly makes sense Shiny context leafletProxy, perhaps might toggle group visibility based input controls sidebar. can also use showGroup()/hideGroup() conjunction addLayersControl() set groups checked default. Finally, can remove layers group using clearGroup(). Note doesn’t just remove layers group, also removes map. (, however, remove group map; still exists, empty.)","code":"map %>% hideGroup(\"Outline\")"},{"path":"https://rstudio.github.io/leaflet/articles/showhide.html","id":"with-marker-clusters","dir":"Articles","previous_headings":"","what":"With Marker Clusters","title":"Show/Hide Layers","text":"markers added different groups, using marker clustering described marker page, leaflet generate different sets clusters different groups. allows showing/hiding marker clusters belonging group independently marker clusters groups.","code":"quakes <- quakes %>% dplyr::mutate(mag.level = cut(mag,c(3,4,5,6), labels = c('>3 & <=4', '>4 & <=5', '>5 & <=6'))) quakes.df <- split(quakes, quakes$mag.level) l <- leaflet() %>% addTiles() names(quakes.df) %>% purrr::walk( function(df) { l <<- l %>% addMarkers(data=quakes.df[[df]], lng=~long, lat=~lat, label=~as.character(mag), popup=~as.character(mag), group = df, clusterOptions = markerClusterOptions(removeOutsideVisibleBounds = FALSE), labelOptions = labelOptions(noHide = FALSE, direction = 'auto')) }) l %>% addLayersControl( overlayGroups = names(quakes.df), options = layersControlOptions(collapsed = FALSE) )"},{"path":"https://rstudio.github.io/leaflet/articles/widget.html","id":"initializing-options","dir":"Articles","previous_headings":"","what":"Initializing Options","title":"The Map Widget","text":"map widget can initialized certain parameters. achieved populating options argument shown . leafletOptions() can passed option described leaflet reference document. Using leafletOptions(), can set custom CRS map displayed non spherical Mercator projection described projections.","code":"# Set value for the minZoom and maxZoom settings. leaflet(options = leafletOptions(minZoom = 0, maxZoom = 18))"},{"path":"https://rstudio.github.io/leaflet/articles/widget.html","id":"map-methods","dir":"Articles","previous_headings":"","what":"Map Methods","title":"The Map Widget","text":"can manipulate attributes map widget using series methods. Please see help page ?setView details. setView() sets center map view zoom level; fitBounds() fits view rectangle [lng1, lat1] – [lng2, lat2]; clearBounds() clears bound, view automatically determined range latitude/longitude data map layers provided;","code":""},{"path":"https://rstudio.github.io/leaflet/articles/widget.html","id":"the-data-object","dir":"Articles","previous_headings":"","what":"The Data Object","title":"The Map Widget","text":"leaflet() map layer functions optional data parameter designed receive spatial data one several forms: lng/lat matrix data frame lng/lat columns data frame returned map() Simple features sf package. leaflet() , additionally, back-compatible sp SpatailDataFrames, although use discouraged new users. data argument used derive spatial data functions need ; example, data sf Simple Features data.frame, calling addPolygons() map widget know add polygons geometry column. straightforward derive variables sf objects since always represent spatial data way. hand, normal matrix data frame, numeric column potentially contain spatial data. resort guessing based column names: latitude variable guessed looking columns named lat latitude (case-insensitive) longitude variable guessed looking lng, long, longitude can always explicitly identify latitude/longitude columns providing lng lat arguments layer function. example, specify values arguments lat lng addCircles() , columns Lat Long data frame df automatically used: can also explicitly specify Lat Long columns (see info ~ syntax): map layer may use different data object override data provided leaflet(). can rewrite example : examples using sf {maps}, respectively:","code":"# add some circles to a map df = data.frame(Lat = 1:10, Long = rnorm(10)) leaflet(df) %>% addCircles() leaflet(df) %>% addCircles(lng = ~Long, lat = ~Lat) leaflet() %>% addCircles(data = df) leaflet() %>% addCircles(data = df, lat = ~ Lat, lng = ~ Long) library(sf) polygon1 <- st_polygon(list(cbind(c(2, 4, 4, 1, 2), c(2, 3, 5, 4, 2)))) polygon2 <- st_polygon(list(cbind(c(5, 4, 2, 5), c(2, 3, 2, 2)))) polygon3 <- st_polygon(list(cbind(c(4, 4, 5, 10, 4), c(5, 3, 2, 5, 5)))) polygon4 <- st_polygon(list(cbind(c(5, 6, 6, 5, 5), c(4, 4, 3, 3, 4)))) multi_polygon <- st_multipolygon(list( list(cbind(c(4, 4, 5, 10, 4), c(5, 3, 2, 5, 5))), list(cbind(c(5, 6, 6, 5, 5), c(4, 4, 3, 3, 4))) )) sf_polygons <- st_sf(geometry = st_sfc(polygon1, polygon2, multi_polygon)) leaflet(height = \"300px\") %>% addPolygons(data = sf_polygons) library(maps) mapStates = map(\"state\", fill = TRUE, plot = FALSE) leaflet(data = mapStates) %>% addTiles() %>% addPolygons(fillColor = topo.colors(10, alpha = NULL), stroke = FALSE)"},{"path":"https://rstudio.github.io/leaflet/articles/widget.html","id":"the-formula-interface","dir":"Articles","previous_headings":"","what":"The Formula Interface","title":"The Map Widget","text":"arguments layer functions can take normal R objects, numeric vector lat argument, character vector colors color argument. can also take one-sided formula, case formula evaluated using data argument environment. example, ~ x means variable x data object, can write arbitrary expressions right-hand side, e.g., ~ sqrt(x + 1).","code":"m = leaflet() %>% addTiles() df = data.frame( lat = rnorm(100), lng = rnorm(100), size = runif(100, 5, 20), color = sample(colors(), 100) ) m = leaflet(df) %>% addTiles() m %>% addCircleMarkers(radius = ~size, color = ~color, fill = FALSE) m %>% addCircleMarkers(radius = runif(100, 4, 10), color = c('red'))"},{"path":"https://rstudio.github.io/leaflet/authors.html","id":null,"dir":"","previous_headings":"","what":"Authors","title":"Authors and Citation","text":"Joe Cheng. Author, maintainer. Barret Schloerke. Author. Bhaskar Karambelkar. Author. Yihui Xie. Author. Hadley Wickham. Contributor. Kenton Russell. Contributor. Kent Johnson. Contributor. Vladimir Agafonkin. Contributor, copyright holder. Leaflet library CloudMade. Copyright holder. Leaflet library Leaflet contributors. Contributor. Leaflet library Brandon Copeland. Contributor, copyright holder. leaflet-measure plugin Joerg Dietrich. Contributor, copyright holder. Leaflet.Terminator plugin Benjamin Becquet. Contributor, copyright holder. Leaflet.MagnifyingGlass plugin Norkart . Contributor, copyright holder. Leaflet.MiniMap plugin L. Voogdt. Contributor, copyright holder. Leaflet.awesome-markers plugin Daniel Montague. Contributor, copyright holder. Leaflet.EasyButton plugin Kartena AB. Contributor, copyright holder. Proj4Leaflet plugin Robert Kajic. Contributor, copyright holder. leaflet-locationfilter plugin Mapbox. Contributor, copyright holder. leaflet-omnivore plugin Michael Bostock. Contributor, copyright holder. topojson . Copyright holder, funder.","code":""},{"path":"https://rstudio.github.io/leaflet/authors.html","id":"citation","dir":"","previous_headings":"","what":"Citation","title":"Authors and Citation","text":"Cheng J, Schloerke B, Karambelkar B, Xie Y (2024). leaflet: Create Interactive Web Maps JavaScript 'Leaflet' Library. R package version 2.2.2.9000, https://github.com/rstudio/leaflet, https://rstudio.github.io/leaflet/.","code":"@Manual{, title = {leaflet: Create Interactive Web Maps with the JavaScript 'Leaflet' Library}, author = {Joe Cheng and Barret Schloerke and Bhaskar Karambelkar and Yihui Xie}, year = {2024}, note = {R package version 2.2.2.9000, https://github.com/rstudio/leaflet}, url = {https://rstudio.github.io/leaflet/}, }"},{"path":"https://rstudio.github.io/leaflet/index.html","id":"an-r-interface-to-leaflet-maps","dir":"","previous_headings":"","what":"Create Interactive Web Maps with the JavaScript Leaflet Library","title":"Create Interactive Web Maps with the JavaScript Leaflet Library","text":"Leaflet open-source JavaScript library interactive maps. R package makes easy create Leaflet maps R.","code":"library(leaflet) m = leaflet() %>% addTiles() m # a map with the default OSM tile layer m = m %>% setView(-93.65, 42.0285, zoom = 17) m m %>% addPopups(-93.65, 42.0285, 'Here is the Department of Statistics<\/b>, ISU')"},{"path":"https://rstudio.github.io/leaflet/index.html","id":"installation","dir":"","previous_headings":"","what":"Installation","title":"Create Interactive Web Maps with the JavaScript Leaflet Library","text":"can install package CRAN, development version GitHub:","code":"# CRAN version install.packages('leaflet') # Or Github version if (!require('devtools')) install.packages('devtools') devtools::install_github('rstudio/leaflet')"},{"path":"https://rstudio.github.io/leaflet/index.html","id":"documentation","dir":"","previous_headings":"","what":"Documentation","title":"Create Interactive Web Maps with the JavaScript Leaflet Library","text":"addition usual R package documentation, also extensive docs examples : https://rstudio.github.io/leaflet/","code":""},{"path":"https://rstudio.github.io/leaflet/index.html","id":"development","dir":"","previous_headings":"","what":"Development","title":"Create Interactive Web Maps with the JavaScript Leaflet Library","text":"leaflet’s JavaScript build tools use Node.js, along yarn manage JavaScript packages. Install yarn using official instructions. can test Node.js yarn installed properly running following commands: make additions modifications JavaScript htmlwidgets binding layer, must Node.js dependencies installed. Now can build/minify/lint/test using yarn build, run “watch” mode just running yarn watch. JS sources go javascript/src tests go javascript/tests.","code":"node --version yarn --version # install dependencies yarn # compile yarn build # watch yarn watch"},{"path":"https://rstudio.github.io/leaflet/index.html","id":"license","dir":"","previous_headings":"","what":"License","title":"Create Interactive Web Maps with the JavaScript Leaflet Library","text":"package licensed terms GNU General Public License version 3 later. Copyright 2013-2015 RStudio, Inc.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/aaa-test-viztest.html","id":null,"dir":"Reference","previous_headings":"","what":"Visual Testing scripts for vistest — aaa-test-viztest","title":"Visual Testing scripts for vistest — aaa-test-viztest","text":"Visual testing examples used vistest package.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/aaa-test-viztest.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Visual Testing scripts for vistest — aaa-test-viztest","text":"","code":"# \\donttest{ ### Start addGeoJSON properties - https://github.com/rstudio/leaflet/pull/625 polygon = list( type = \"Polygon\", coordinates = list( list( c(8.330469, 48.261570), c(8.339052, 48.261570), c(8.339052, 48.258227), c(8.330469, 48.258227), c(8.330469, 48.261570) ) ) ) # should produce an orange-ish rectangle around `Ramsel` leaflet() %>% addTiles() %>% addGeoJSON(polygon, color=\"#F00\") %>% setView(lng = 8.330469, lat = 48.26157, zoom = 15) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addGeoJSON\",\"args\":[{\"type\":\"Polygon\",\"coordinates\":[[[8.330469000000001,48.26157],[8.339052000000001,48.26157],[8.339052000000001,48.258227],[8.330469000000001,48.258227],[8.330469000000001,48.26157]]]},null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#F00\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#F00\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false}]}],\"setView\":[[48.26157,8.330469000000001],15,[]]},\"evals\":[],\"jsHooks\":[]}### End PR #625 # } # end donttest"},{"path":"https://rstudio.github.io/leaflet/reference/addAwesomeMarkers.html","id":null,"dir":"Reference","previous_headings":"","what":"Add Awesome Markers — addAwesomeMarkers","title":"Add Awesome Markers — addAwesomeMarkers","text":"Add Awesome Markers","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addAwesomeMarkers.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add Awesome Markers — addAwesomeMarkers","text":"","code":"addAwesomeMarkers( map, lng = NULL, lat = NULL, layerId = NULL, group = NULL, icon = NULL, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = markerOptions(), clusterOptions = NULL, clusterId = NULL, data = getMapData(map) )"},{"path":"https://rstudio.github.io/leaflet/reference/addAwesomeMarkers.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add Awesome Markers — addAwesomeMarkers","text":"map map add awesome Markers . lng numeric vector longitudes, one-sided formula form ~x x variable data; default (explicitly provided), automatically inferred data looking column named lng, long, longitude (case-insensitively) lat vector latitudes formula (similar lng argument; names lat latitude used guessing latitude column data) layerId layer id group name group newly created layers belong (clearGroup() addLayersControl() purposes). Human-friendly group names permitted–need short, identifier-style names. number layers even different types layers (e.g., markers polygons) can share group name. icon icon(s) markers; popup character vector HTML content popups (recommended escape text using htmltools::htmlEscape() security reasons) popupOptions Vector popupOptions() provide popups label character vector HTML content labels labelOptions Vector labelOptions() provide label options label. Default NULL options list extra options tile layers, popups, paths (circles, rectangles, polygons, ...), map elements clusterOptions NULL, markers clustered using Leaflet.markercluster; can use markerClusterOptions() specify marker cluster options clusterId id marker cluster layer data data object argument values derived; default, data object provided leaflet() initially, can overridden","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addGraticule.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a Graticule on the map — addGraticule","title":"Add a Graticule on the map — addGraticule","text":"Add Graticule map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addGraticule.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a Graticule on the map — addGraticule","text":"","code":"addGraticule( map, interval = 20, sphere = FALSE, style = list(color = \"#333\", weight = 1), layerId = NULL, group = NULL, options = pathOptions(pointerEvents = \"none\", clickable = FALSE) )"},{"path":"https://rstudio.github.io/leaflet/reference/addGraticule.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a Graticule on the map — addGraticule","text":"map map widget object interval spacing map units horizontal vertical lines. sphere boolean. Default FALSE style path options generated lines. See https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#path-option layerId layer id group name group layer belongs . options path options graticule layer","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/addGraticule.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a Graticule on the map — addGraticule","text":"","code":"leaf <- leaflet() %>% addTiles() %>% addGraticule() leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addGraticule\",\"args\":[20,false,{\"color\":\"#333\",\"weight\":1},null,null,{\"interactive\":false,\"pointerEvents\":\"none\",\"className\":\"\"}]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addLayersControl.html","id":null,"dir":"Reference","previous_headings":"","what":"Add UI controls to switch layers on and off — addLayersControl","title":"Add UI controls to switch layers on and off — addLayersControl","text":"Uses Leaflet's built-layers control feature allow users choose one several base layers, choose number overlay layers view.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addLayersControl.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add UI controls to switch layers on and off — addLayersControl","text":"","code":"addLayersControl( map, baseGroups = character(0), overlayGroups = character(0), position = c(\"topright\", \"bottomright\", \"bottomleft\", \"topleft\"), options = layersControlOptions(), data = getMapData(map) ) layersControlOptions(collapsed = TRUE, autoZIndex = TRUE, ...) removeLayersControl(map)"},{"path":"https://rstudio.github.io/leaflet/reference/addLayersControl.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add UI controls to switch layers on and off — addLayersControl","text":"map map add layers control baseGroups character vector element name group. user able choose one base group () time. commonly used mostly-opaque tile layers. overlayGroups character vector element name group. user can turn overlay group independently. position position control: \"topleft\", \"topright\", \"bottomleft\", \"bottomright\". options list additional options, intended provided call layersControlOptions() data data object argument values derived; default, data object provided leaflet() initially, can overridden collapsed TRUE (default), layers control rendered icon expands hovered . Set FALSE layers control always appear expanded state. autoZIndex TRUE, control automatically maintain z-order various groups overlays switched . ... options layersControlOptions()","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addLayersControl.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add UI controls to switch layers on and off — addLayersControl","text":"","code":"# \\donttest{ leaflet() %>% addTiles(group = \"OpenStreetMap\") %>% addProviderTiles(\"CartoDB.Voyager\", group = \"Carto Voyager\") %>% addMarkers(runif(20, -75, -74), runif(20, 41, 42), group = \"Markers\") %>% addLayersControl( baseGroups = c(\"OpenStreetMap\", \"Carto Voyager\"), overlayGroups = c(\"Markers\") ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,\"OpenStreetMap\",{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addProviderTiles\",\"args\":[\"CartoDB.Voyager\",null,\"Carto Voyager\",{\"errorTileUrl\":\"\",\"noWrap\":false,\"detectRetina\":false}]},{\"method\":\"addMarkers\",\"args\":[[41.28989229537547,41.67838042741641,41.73531959881075,41.19595673307776,41.98053967463784,41.74152152915485,41.05144627625123,41.53021246357821,41.69582387898117,41.68855600338429,41.03123032534495,41.22556253452785,41.30083080613986,41.63646561489441,41.47902454971336,41.43217125814408,41.70643383776769,41.94857657630928,41.18033876805566,41.21689987648278],[-74.91924986243248,-74.16566696274094,-74.39923911378719,-74.84279155847616,-74.99260055879131,-74.53360650269315,-74.50222261133604,-74.7102327554021,-74.26711801299825,-74.22747848881409,-74.12539933924563,-74.82505937316455,-74.96575866732746,-74.67961426917464,-74.59767176164314,-74.80433016526513,-74.59646188258193,-74.93633854272775,-74.61129868682474,-74.02445216476917],null,null,\"Markers\",{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"addLayersControl\",\"args\":[[\"OpenStreetMap\",\"Carto Voyager\"],\"Markers\",{\"collapsed\":true,\"autoZIndex\":true,\"position\":\"topright\"}]}],\"limits\":{\"lat\":[41.03123032534495,41.98053967463784],\"lng\":[-74.99260055879131,-74.02445216476917]}},\"evals\":[],\"jsHooks\":[]}# }"},{"path":"https://rstudio.github.io/leaflet/reference/addLegend.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a color legend to a map — addLegend","title":"Add a color legend to a map — addLegend","text":"color palette function used map (e.g., colorNumeric()), color legend can automatically derived palette function. can also manually specify colors labels legend.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addLegend.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a color legend to a map — addLegend","text":"","code":"addLegend( map, position = c(\"topright\", \"bottomright\", \"bottomleft\", \"topleft\"), pal, values, na.label = \"NA\", bins = 7, colors, opacity = 0.5, labels = NULL, labFormat = labelFormat(), title = NULL, className = \"info legend\", layerId = NULL, group = NULL, data = getMapData(map) ) labelFormat( prefix = \"\", suffix = \"\", between = \" – \", digits = 3, big.mark = \",\", transform = identity )"},{"path":"https://rstudio.github.io/leaflet/reference/addLegend.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a color legend to a map — addLegend","text":"map map widget object created leaflet() position position legend pal color palette function, generated colorNumeric(), colorBin(), colorQuantile(), colorFactor() values values used generate colors palette function na.label legend label NAs values bins approximate number tick-marks color gradient colorNumeric palette length one; can also provide numeric vector pre-defined breaks (equally spaced) colors vector (HTML) colors used legend pal provided opacity opacity colors labels vector text labels legend corresponding colors labFormat function format labels derived pal values (see Details know labelFormat() returns default; can either use helper function labelFormat(), write function) title legend title className extra CSS classes append control, space separated layerId ID legend; subsequent calls addLegend() addControl() layerId replace legend. ID can also used removeControl(). group group name leaflet layer group. Supplying value tie legend leaflet layer group name auto add/remove legend group added/removed, example via layerControl(). need set group add layer (e.g., addPolygons()) supply name . data data object argument values derived; default, data object provided leaflet() initially, can overridden prefix prefix legend labels suffix suffix legend labels separator x[] x[+ 1] legend labels (default, dash) digits number digits numeric values labels big.mark thousand separator transform function transform label value","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addLegend.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Add a color legend to a map — addLegend","text":"labFormat argument function takes argument type = c(\"numeric\", \"bin\", \"quantile\", \"factor\"), plus, arguments different types color palettes. colorNumeric() palette, labFormat takes single argument, breaks numeric vector, returns character vector length. colorBin(), labFormat also takes vector breaks length n return character vector length n - 1, -th element representing interval c(x[], x[+ 1]). colorQuantile(), labFormat takes two arguments, quantiles associated probabilities (length n), return character vector length n - 1 (similar colorBin() palette). colorFactor(), labFormat takes one argument, unique values factor, return character vector length. default, labFormat basically format(scientific = FALSE, big.mark = \",\") numeric palette, .character() factor palette, function return labels form x[] - x[+ 1] bin quantile palettes (case quantile palettes, x probabilities instead values breaks).","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addLegend.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a color legend to a map — addLegend","text":"","code":"# !formatR library(leaflet) # a manual legend leaflet() %>% addTiles() %>% addLegend( position = \"bottomright\", colors = rgb(t(col2rgb(palette())) / 255), labels = palette(), opacity = 1, title = \"An Obvious Legend\" ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addLegend\",\"args\":[{\"colors\":[\"#000000\",\"#DF536B\",\"#61D04F\",\"#2297E6\",\"#28E2E5\",\"#CD0BBC\",\"#F5C710\",\"#9E9E9E\"],\"labels\":[\"black\",\"#DF536B\",\"#61D04F\",\"#2297E6\",\"#28E2E5\",\"#CD0BBC\",\"#F5C710\",\"gray62\"],\"na_color\":null,\"na_label\":\"NA\",\"opacity\":1,\"position\":\"bottomright\",\"type\":\"unknown\",\"title\":\"An Obvious Legend\",\"extra\":null,\"layerId\":null,\"className\":\"info legend\",\"group\":null}]}]},\"evals\":[],\"jsHooks\":[]} # \\donttest{ # an automatic legend derived from the color palette df <- local({ n <- 300; x <- rnorm(n); y <- rnorm(n) z <- sqrt(x ^ 2 + y ^ 2); z[sample(n, 10)] <- NA data.frame(x, y, z) }) pal <- colorNumeric(\"OrRd\", df$z) leaflet(df) %>% addTiles() %>% addCircleMarkers(~x, ~y, color = ~pal(z), group = \"circles\") %>% addLegend(pal = pal, values = ~z, group = \"circles\", position = \"bottomleft\") %>% addLayersControl(overlayGroups = c(\"circles\")) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[0.6505335516663909,0.3439133370803937,1.477532312122079,0.07202569848562312,2.126444534053145,-1.476196905665011,0.4078884997730672,1.393977798163443,0.3602782963824587,0.654550251367236,1.052155421638391,-1.979555125375499,1.208385605077569,-0.1692800840101273,0.2950297525088386,1.266340586731399,-1.135343256731542,-1.131053798136733,0.1099933842482332,0.8529054098496378,-0.2343378617328363,2.086688567419564,-0.1109193711378142,-1.392847056486805,-1.142290768301507,1.704608737476107,-0.08007363420444615,-0.4372812395618814,-0.1192150943099993,0.7864628648871801,-0.578945246005208,-0.1454268853396554,0.5264579905303892,1.733578109587555,1.448657219890587,1.518193149429752,-0.3840072542956225,1.827125177326342,-0.5514917498897072,-0.8657535409638455,-0.3438314805274069,1.062876458408378,0.8130582039749211,1.803483360509342,-0.1050686940262848,0.98245336219486,-1.713302622089714,-0.8320195265654265,1.100491881658022,-0.1738201059067313,0.1788120182760854,-0.6984294493425443,-0.9604491590301349,-0.97542304241414,-0.3385765031429888,1.152347074186777,0.4051011834930712,-0.4709224972691391,-0.1332510187207652,1.226682355623377,0.3329439951460119,-0.3470884662878682,-0.09855069024628586,0.03476605997672152,0.386127021879785,0.02083122824075784,0.007586777029884506,0.930844030400638,-0.6847499412558499,0.3374015128989138,-0.4121377037330259,0.9342611301961558,1.840316740968912,-0.7048196633302973,0.008510312347171704,2.034189886387702,-1.341686068324058,1.158979182334556,-0.2032089577553381,-0.3780285548642988,1.736111042681378,-0.8452478159400637,-0.9615714932597695,1.01749105255407,-1.496053742070577,-1.184818729878542,0.6302343731964918,2.101252513811306,-0.6137368097381497,-1.634638271926792,-0.01044111669616038,-0.6565061387600695,-0.6695334414548653,-0.4785890275037744,1.319456316497346,0.6365627611607734,0.5143277816931332,-1.75137511333889,0.8935975183721073,0.223038372343281,0.5808165932265656,-0.1778214210556546,0.7409667077822469,-0.9974430787594897,-2.938977561072442,0.7190156610442144,-0.6980050412308539,-1.894125843416095,0.07629924890404224,0.8753085008667204,0.4538273928547277,-0.8507169060610854,0.5662016125567449,1.152211954306609,-0.7561973771310204,-0.4892583340844989,-1.166052336594417,-0.4796689501890092,0.1153482175160142,-1.768048406882717,-1.407638918566151,0.7091784609457917,-1.240842940399721,-0.3683273481213414,0.4620800934471069,-0.3228331006706945,-1.287214809847799,-1.030040246855714,1.514089316331298,0.3469035861511874,1.779441541548383,0.3866309242205058,-0.9186952386197336,-1.584336488240057,-0.084058892399114,-2.085070889151488,0.003567991787201713,-0.355770822296309,1.146359751427157,-0.2211884456264634,1.018179020928247,-0.2637192952328821,1.658542304551605,-0.7740867711750815,-0.9239378800876532,-0.2755333776535783,-0.5933996879968637,-0.1222858911464302,1.179784246068877,0.6410373738209756,-0.6295885083684619,-0.8077349712069041,-0.8604899291575122,-2.16923869330458,-1.375836518354382,-0.4931324720727169,-0.5816520267788866,-0.1672293036420109,0.4859931285030712,-1.333395795997445,-0.2619656249251471,0.6523863025596753,0.7488549707455571,0.8965602854300257,1.489300423558251,-0.6594034811959866,0.5372831789200957,0.746803066897829,1.896317084370534,-2.0600707247633,0.06454387046377778,-0.2651474026374209,-0.4473445311520631,-1.410700926985981,-0.5064188824072395,-0.2697618382139775,-1.085154917623207,0.3621591266320203,-0.3356721426325846,1.363804497533668,-0.7115241362918345,0.6621787965713957,0.2911302230140996,0.1979580003853844,-1.203566106356997,-0.03981704378226512,0.6869824649050091,0.705267006543464,0.9914416799979249,1.144248971435072,-1.238910242650941,2.654898332699442,-0.1569171888574195,-0.4234901170745928,-0.1983870584249001,-0.8948024072227327,0.9042691190431756,0.07964920984534384,-1.258827222962834,1.025685106130799,-0.7307786028097205,-0.1901455074993663,0.5288646933499248,0.5502105345322271,0.5496843365697919,-0.6595423716192781,0.0574217063913861,-2.808010508303309,-0.9122597530905465,-0.782379162703709,-0.6641049243406778,0.6263097696416825,-0.5072482060373515,0.2703613349062201,0.4674768647758839,0.7239949575018431,0.6138369385442269,-0.6178692021819572,0.2207249020696187,1.127926598212154,1.813454336179437,-0.08382568484351753,1.367706666002093,-0.627434620111653,-0.2166291499658856,-0.6837138237264272,-0.4447027339757115,0.6064898064006521,0.6241830746378563,-0.6954310738216589,-0.783639077924157,-0.953123859114486,1.792756071394783,0.3489766963273593,0.2591037678253732,-0.8059518969450901,0.1056647011829329,-0.3335996818106244,1.641847970388761,-0.6439058589480844,0.5870205615919971,-0.1504030875803916,-1.710821847844759,1.431032557930156,-2.645212268017654,-1.032457405437779,-0.7074664305555289,-0.7005600138809843,0.5378854388923792,-0.3163321749851825,-0.8396227542924231,-1.354928061563667,-0.8175682718860641,-0.634400003317215,0.8159494326259117,0.3027957064724629,1.807086624720854,-0.8940267556963469,-0.04642821127510827,-0.4711791375412447,-0.5266926303512832,-0.09513490757602368,-2.49536480915438,0.1668892166323685,0.3504923837028274,1.433701009281874,0.7659068025325554,1.167520669842047,-0.1369434285990991,-0.514902043516776,1.519744468347238,-0.3284916776050828,-0.05367150615080171,-0.5635246348339656,-0.7439089627975433,-0.109041651464962,-0.5608292270314029,0.1880015489639772,0.7488509422673059,-1.916538316499208,0.2360958467590485,0.6289534152439918,0.4179256757377173,1.976758476646552,-0.5062862982295411,-1.109968852679318,-0.9487057228869408,0.4768437567160564,-0.7952015604742242,0.2343269225062964,-1.222451097219617,-2.453647353884026,-1.489260813902866,-0.4321477341346315,-0.9425540060913923,-0.1214507994148979,1.336446797920755,-0.8603561817741221,0.6665378197568235,-1.421534745704272],[0.4681544204505332,0.3629512558649863,-1.304543545034777,0.7377763212550469,1.888504929234545,-0.09744510440820592,-0.935847353500678,-0.01595031125053767,-0.8267889537334427,-1.512399651262802,0.9353631898010852,0.1764886105624587,0.2436854647462048,1.623548883443603,0.1120380828697629,-0.1339970130625548,-1.910087467722212,-0.2792372415848446,-0.3134459782578902,1.067307878761509,0.07003485029663825,-0.6391233238856642,-0.04996489904814528,-0.2514834432502139,0.4447971157927279,2.755417575336856,0.04653138044419327,0.5777090693066309,0.1181948744096827,-1.911720491028202,0.8620864818385676,-0.2432367396334755,-0.2060871947815807,0.01917759220914627,0.02956075431976639,0.5498275418016892,-2.27411485689294,2.682557183556348,-0.3612212554937149,0.2133557497100296,1.074345882259687,-0.6650882485455054,1.113952418969221,-0.2458964116791525,-1.177563308943281,-0.9758506161598627,1.065057320027152,0.1316706347728944,0.4886288092009806,-1.699450567845694,-1.470736306377429,0.284150343626922,1.337320413235585,0.2366962832865029,1.318293384034629,0.523909787501208,0.6067480465571182,-0.1099356721448703,0.1721817154109998,-0.09032728700066237,1.924343341357788,1.298392758830878,0.7487912675368434,0.5562243291042956,-0.5482572637388645,1.110534892581847,-2.612334332884302,-0.1556937762300525,0.4338897899172486,-0.3819511118161664,0.424187574547461,1.063101995848779,1.048712619755727,-0.03810289481312842,0.4861489195152453,1.672882610832484,-0.3543611635564431,0.9463478864665497,1.316826356044166,-0.2966400245918269,-0.3872135752484032,-0.7854326557803378,-1.056736866993165,-0.7955414295478087,-1.75627542817088,-0.6905378968217506,-0.5585419942187778,-0.5366633264973131,0.2271271327282389,0.9784549202432402,-0.2088826513518269,-1.399410460011772,0.2585372879085119,-0.4417994529113526,0.5685998612153402,2.126850459034092,0.4248584413142624,-1.684281532249712,0.2494017839693337,1.072838251816417,2.039369262502845,0.44945377806039,1.391814045638341,0.4265665469035525,0.1075839922136646,0.02229473312834223,0.6036110105071092,-0.2626505728493916,-0.5282640823709871,0.192149422037578,-1.146199668992958,0.8461846647976611,0.08171962925155422,-1.305117009935323,-0.9449120599497581,0.4543415943151341,-0.8552025008083601,-0.286895218789768,0.8949616255194962,0.06730443969208399,-0.1626763372062715,-0.8273101693111616,1.876505621025494,0.7664401988790351,0.9799566955863486,1.321780991628453,-1.119710828611191,0.5145998185396484,-1.509099835769665,1.532741480322484,0.4291473711320516,0.1221034144722543,-1.138012400593859,-0.5580151294182988,1.052538536901614,0.6776836443013914,0.03849954706442122,-0.3563811870040085,0.7828441018398227,0.8044116161292381,-1.900060823356954,0.9357842861588199,-0.309051503430768,0.2630666769626157,-1.790591855858061,-0.7882588446129118,-1.133021668720607,0.3636525683732274,-0.2858879143030657,0.5176691339974225,-0.1029086701191043,-0.9740695932654561,1.270672300795927,0.9608647870777737,0.7687213695941441,1.035930771080959,-0.4738870742730695,-1.275334874636281,-0.3056206738296712,2.211769486838729,-1.041668380878399,-1.146523850214245,-1.675327303364422,1.525938655037313,0.554185514898162,1.993110264862642,-0.1541207395561243,2.564408337997415,1.061999144545892,1.142694878429166,1.123838843262287,-0.3970014930596247,-0.8232611505671266,-0.5788846247120997,1.763789377571501,0.1329921464040768,0.376499328478288,1.138707653403021,1.24126307530705,0.6120909449591372,-0.4293800871157708,1.360461326770395,-0.07085743067700484,-0.2721536843207814,-2.446680029212921,0.06548664141022381,-1.098508901825947,-0.6331781755248498,-2.063654450538815,2.648932028562412,-1.153398386456107,-0.3406378760312316,0.7863625763097764,-1.270513110211809,0.5421415494418939,0.07510590016820631,0.5585144216644959,0.415406398921884,-1.452299768865976,0.9412061217015445,-0.3389358717098562,-0.07557424745070103,0.04020439205042322,0.1243010661274679,-0.998432550587131,1.233390064881899,0.3404244875613024,-0.472702482118151,0.7087530605311343,-1.528958714659617,0.2374253451731978,-1.3128142464708,0.7470285870863597,-1.562518434645852,0.07105335956777852,-0.6395347702069698,-0.8451957385518639,0.6752446980817243,1.153375793925207,-1.686504742442198,-0.9028149492200698,1.317633697823867,1.100189744544784,1.203767839386912,-1.431270776889989,1.382910860570339,0.003125940412181876,-0.07788682438757535,0.4414282259284606,0.1289228962236909,-0.8302142603636163,-0.5035929097116129,-1.19364118200992,-0.7517233228909227,1.455841403008231,-0.8286035327893002,0.2897744603757754,-0.4800534842711301,-0.6048293542152092,1.460110180396234,0.1496793540957,-1.433321100298199,-0.01030331862859197,-0.2122360348379401,-0.9063401785642264,-2.102152478895267,1.893360463671002,-0.9681258370240697,-0.1026030363768813,0.2399595721218171,0.06089889324995736,-2.177576028275485,-0.117860143249397,0.1122947874062589,0.007886197667537481,1.877743871542488,2.158756553649643,0.7097145222400491,0.7669833787543111,-0.3082114208255147,1.012001848561405,-0.9190515969353139,0.5633800772498873,0.3224827493152965,0.3666743632573016,1.129835153417458,-0.9414980759314387,0.2178376429447302,1.415412293051703,-0.3837330479260749,-0.1740863735877855,-0.2217445171338238,-1.009528722482581,0.4807252662688465,1.604407328261084,-1.515024528820714,-1.416023914493506,0.8767773265560754,0.6241324126213942,2.112277287816144,-0.3561244157226174,-1.064464208651573,1.077116538453967,1.181575566544048,0.198392094643414,-0.4004052494081449,0.6161542807326543,1.974156747983414,1.884662324235259,-1.588620546593662,-0.5399231641104368,-1.16946146365045,0.5591059885745473,-1.819347246617953,0.3933439723958107,0.04213410586766129,1.179664176947687,-0.2569211761841879,-1.056336097801672,0.1987772051264224],10,null,\"circles\",{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":[\"#FDD6A2\",\"#FEE5C2\",\"#F16D4B\",\"#FED9A8\",\"#B30000\",\"#FDA06A\",\"#FDC992\",\"#FDAA73\",\"#FDD09A\",\"#FC8C59\",\"#FDA872\",\"#F16B4A\",\"#FDBC85\",\"#FC8E5A\",\"#FFEDD3\",\"#FDB780\",\"#E54F36\",\"#FDC089\",\"#FEECD2\",\"#FDAD76\",\"#FFEFD9\",\"#E7543A\",\"#FFF4E5\",\"#FDA771\",\"#FDBC85\",\"#800000\",\"#FFF5E7\",\"#FEDAAA\",\"#FFF2E0\",\"#EE6246\",\"#FDC891\",\"#808080\",\"#FEE2BB\",\"#F98455\",\"#FDA46E\",\"#FC905C\",\"#E0442D\",\"#7F0000\",\"#FEDDB1\",\"#FDD19B\",\"#FDC28B\",\"#FDBA83\",\"#FDAB75\",\"#F67C51\",\"#FDBF88\",\"#FDAB74\",\"#F06849\",\"#FDD49E\",\"#FDBD86\",\"#FA8756\",\"#FDA06A\",\"#FDD8A7\",\"#FC8D59\",\"#FDCA93\",\"#FDAE77\",\"#808080\",\"#FED9AA\",\"#FEE6C3\",\"#FFF0DC\",\"#FDBC85\",\"#F26E4C\",\"#FDAF79\",\"#FDD8A7\",\"#FEE2BC\",\"#FEDCB0\",\"#FDC38C\",\"#C82112\",\"#FDCE97\",\"#FDD5A1\",\"#FEE4C1\",\"#FEE0B8\",\"#FDA771\",\"#EB5C40\",\"#FEDBAC\",\"#FEE6C3\",\"#C61E11\",\"#FDAB74\",\"#FD9E68\",\"#FDB17A\",\"#FEE6C4\",\"#F88053\",\"#FDC08A\",\"#FDA670\",\"#FDB57F\",\"#DF442D\",\"#FDAC76\",\"#FDD49E\",\"#E8563B\",\"#FEDDB1\",\"#F4734E\",\"#FFF1DD\",\"#FD9863\",\"#FEDAAB\",\"#FEDDB2\",\"#FDA56F\",\"#E55036\",\"#FEDDB0\",\"#808080\",\"#FDCF98\",\"#FDC48D\",\"#EB5C40\",\"#FEE6C3\",\"#FD9560\",\"#FDC58E\",\"#A60001\",\"#FEDAAB\",\"#FDCF99\",\"#F3734D\",\"#FEE3BE\",\"#808080\",\"#FDBC85\",\"#FDBE87\",\"#FEE1BA\",\"#F98355\",\"#FDBD86\",\"#FEDDB0\",\"#FDA46E\",\"#FEE2BB\",\"#FDD09A\",\"#F88154\",\"#FDA771\",\"#FDC48E\",\"#E34C33\",\"#FDD39D\",\"#FDC58E\",\"#FDAE77\",\"#808080\",\"#FDC18A\",\"#EA5A3E\",\"#808080\",\"#F67B51\",\"#FEE9CB\",\"#808080\",\"#FB8957\",\"#FDC790\",\"#E65339\",\"#FFF7EC\",\"#FEE5C1\",\"#FDAA74\",\"#FDD49F\",\"#E9583C\",\"#FDCC95\",\"#FB8957\",\"#FDD5A0\",\"#F06849\",\"#FDD49F\",\"#FDB780\",\"#FEEACD\",\"#FDBD86\",\"#FDD5A0\",\"#FEDEB3\",\"#FDB881\",\"#FD9A64\",\"#DB3B26\",\"#FD9560\",\"#FDC18A\",\"#FED8A7\",\"#FDB67F\",\"#FEE1BA\",\"#CA2415\",\"#FDC58F\",\"#FDB27C\",\"#F67A51\",\"#F88153\",\"#FC935F\",\"#EC5E42\",\"#FEE2BB\",\"#C31A0E\",\"#E7553B\",\"#DD3E28\",\"#FDC28B\",\"#FEE6C4\",\"#FDCE98\",\"#FD9B65\",\"#F67A51\",\"#FFEDD4\",\"#FDC18A\",\"#FDBE87\",\"#FDB67F\",\"#FD9E69\",\"#FDD49F\",\"#FD9C67\",\"#FFEDD5\",\"#FEECD1\",\"#BE1409\",\"#FFF6E9\",\"#FDB57E\",\"#FDCD97\",\"#E1472F\",\"#AE0000\",\"#FA8857\",\"#C21A0D\",\"#FDD6A2\",\"#FDB079\",\"#FEE1BA\",\"#FDD09A\",\"#FDC690\",\"#FEE9C9\",\"#F3724D\",\"#FDAA74\",\"#FDD6A2\",\"#FFF1DD\",\"#FEE3BE\",\"#FEE2BB\",\"#FDC18B\",\"#FDA973\",\"#FEECD0\",\"#B30000\",\"#FDC08A\",\"#FA8656\",\"#FEDBAC\",\"#FDA36D\",\"#FDD09A\",\"#FD945F\",\"#FEE6C4\",\"#FDCC96\",\"#FDC791\",\"#FDCF99\",\"#FDBF88\",\"#EF6649\",\"#F06749\",\"#FDB27B\",\"#F88254\",\"#FDAE77\",\"#FDA46E\",\"#FD9964\",\"#FEE8C7\",\"#FEDFB6\",\"#FDD8A6\",\"#FEDBAC\",\"#FDC18A\",\"#FDC58F\",\"#E9583D\",\"#FDD59F\",\"#FDA06A\",\"#FDC089\",\"#FFEDD4\",\"#FEE1B9\",\"#F98354\",\"#FC925E\",\"#FEE0B7\",\"#FDA46E\",\"#FA8656\",\"#FDA46E\",\"#B70903\",\"#DD4029\",\"#F06749\",\"#FDBE87\",\"#FEE3BD\",\"#FEEACC\",\"#FDD49E\",\"#CC2516\",\"#FDD5A0\",\"#FEDEB2\",\"#FDD5A1\",\"#F4744E\",\"#B60502\",\"#FDC18A\",\"#FDD8A6\",\"#FEE2BB\",\"#FDC18A\",\"#FDCF99\",\"#808080\",\"#FEEBCF\",\"#FEE5C1\",\"#808080\",\"#FDBD86\",\"#808080\",\"#FDA770\",\"#FEDEB3\",\"#FD9A65\",\"#FEEACC\",\"#FDC993\",\"#FED9A8\",\"#F88154\",\"#FD9B66\",\"#FD9B66\",\"#FDD19A\",\"#FDCC95\",\"#B20000\",\"#FEE8C9\",\"#FDBB84\",\"#FDC08A\",\"#E0452D\",\"#FEE3BD\",\"#FDBF88\",\"#FDC28B\",\"#EF6649\",\"#EF6548\",\"#FC915D\",\"#FDB07A\",\"#BE1509\",\"#FC935E\",\"#F5774F\",\"#FDC992\",\"#FFF4E4\",\"#F87F53\",\"#FDD09A\",\"#FDBA83\",\"#FDA56F\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#FDD6A2\",\"#FEE5C2\",\"#F16D4B\",\"#FED9A8\",\"#B30000\",\"#FDA06A\",\"#FDC992\",\"#FDAA73\",\"#FDD09A\",\"#FC8C59\",\"#FDA872\",\"#F16B4A\",\"#FDBC85\",\"#FC8E5A\",\"#FFEDD3\",\"#FDB780\",\"#E54F36\",\"#FDC089\",\"#FEECD2\",\"#FDAD76\",\"#FFEFD9\",\"#E7543A\",\"#FFF4E5\",\"#FDA771\",\"#FDBC85\",\"#800000\",\"#FFF5E7\",\"#FEDAAA\",\"#FFF2E0\",\"#EE6246\",\"#FDC891\",\"#808080\",\"#FEE2BB\",\"#F98455\",\"#FDA46E\",\"#FC905C\",\"#E0442D\",\"#7F0000\",\"#FEDDB1\",\"#FDD19B\",\"#FDC28B\",\"#FDBA83\",\"#FDAB75\",\"#F67C51\",\"#FDBF88\",\"#FDAB74\",\"#F06849\",\"#FDD49E\",\"#FDBD86\",\"#FA8756\",\"#FDA06A\",\"#FDD8A7\",\"#FC8D59\",\"#FDCA93\",\"#FDAE77\",\"#808080\",\"#FED9AA\",\"#FEE6C3\",\"#FFF0DC\",\"#FDBC85\",\"#F26E4C\",\"#FDAF79\",\"#FDD8A7\",\"#FEE2BC\",\"#FEDCB0\",\"#FDC38C\",\"#C82112\",\"#FDCE97\",\"#FDD5A1\",\"#FEE4C1\",\"#FEE0B8\",\"#FDA771\",\"#EB5C40\",\"#FEDBAC\",\"#FEE6C3\",\"#C61E11\",\"#FDAB74\",\"#FD9E68\",\"#FDB17A\",\"#FEE6C4\",\"#F88053\",\"#FDC08A\",\"#FDA670\",\"#FDB57F\",\"#DF442D\",\"#FDAC76\",\"#FDD49E\",\"#E8563B\",\"#FEDDB1\",\"#F4734E\",\"#FFF1DD\",\"#FD9863\",\"#FEDAAB\",\"#FEDDB2\",\"#FDA56F\",\"#E55036\",\"#FEDDB0\",\"#808080\",\"#FDCF98\",\"#FDC48D\",\"#EB5C40\",\"#FEE6C3\",\"#FD9560\",\"#FDC58E\",\"#A60001\",\"#FEDAAB\",\"#FDCF99\",\"#F3734D\",\"#FEE3BE\",\"#808080\",\"#FDBC85\",\"#FDBE87\",\"#FEE1BA\",\"#F98355\",\"#FDBD86\",\"#FEDDB0\",\"#FDA46E\",\"#FEE2BB\",\"#FDD09A\",\"#F88154\",\"#FDA771\",\"#FDC48E\",\"#E34C33\",\"#FDD39D\",\"#FDC58E\",\"#FDAE77\",\"#808080\",\"#FDC18A\",\"#EA5A3E\",\"#808080\",\"#F67B51\",\"#FEE9CB\",\"#808080\",\"#FB8957\",\"#FDC790\",\"#E65339\",\"#FFF7EC\",\"#FEE5C1\",\"#FDAA74\",\"#FDD49F\",\"#E9583C\",\"#FDCC95\",\"#FB8957\",\"#FDD5A0\",\"#F06849\",\"#FDD49F\",\"#FDB780\",\"#FEEACD\",\"#FDBD86\",\"#FDD5A0\",\"#FEDEB3\",\"#FDB881\",\"#FD9A64\",\"#DB3B26\",\"#FD9560\",\"#FDC18A\",\"#FED8A7\",\"#FDB67F\",\"#FEE1BA\",\"#CA2415\",\"#FDC58F\",\"#FDB27C\",\"#F67A51\",\"#F88153\",\"#FC935F\",\"#EC5E42\",\"#FEE2BB\",\"#C31A0E\",\"#E7553B\",\"#DD3E28\",\"#FDC28B\",\"#FEE6C4\",\"#FDCE98\",\"#FD9B65\",\"#F67A51\",\"#FFEDD4\",\"#FDC18A\",\"#FDBE87\",\"#FDB67F\",\"#FD9E69\",\"#FDD49F\",\"#FD9C67\",\"#FFEDD5\",\"#FEECD1\",\"#BE1409\",\"#FFF6E9\",\"#FDB57E\",\"#FDCD97\",\"#E1472F\",\"#AE0000\",\"#FA8857\",\"#C21A0D\",\"#FDD6A2\",\"#FDB079\",\"#FEE1BA\",\"#FDD09A\",\"#FDC690\",\"#FEE9C9\",\"#F3724D\",\"#FDAA74\",\"#FDD6A2\",\"#FFF1DD\",\"#FEE3BE\",\"#FEE2BB\",\"#FDC18B\",\"#FDA973\",\"#FEECD0\",\"#B30000\",\"#FDC08A\",\"#FA8656\",\"#FEDBAC\",\"#FDA36D\",\"#FDD09A\",\"#FD945F\",\"#FEE6C4\",\"#FDCC96\",\"#FDC791\",\"#FDCF99\",\"#FDBF88\",\"#EF6649\",\"#F06749\",\"#FDB27B\",\"#F88254\",\"#FDAE77\",\"#FDA46E\",\"#FD9964\",\"#FEE8C7\",\"#FEDFB6\",\"#FDD8A6\",\"#FEDBAC\",\"#FDC18A\",\"#FDC58F\",\"#E9583D\",\"#FDD59F\",\"#FDA06A\",\"#FDC089\",\"#FFEDD4\",\"#FEE1B9\",\"#F98354\",\"#FC925E\",\"#FEE0B7\",\"#FDA46E\",\"#FA8656\",\"#FDA46E\",\"#B70903\",\"#DD4029\",\"#F06749\",\"#FDBE87\",\"#FEE3BD\",\"#FEEACC\",\"#FDD49E\",\"#CC2516\",\"#FDD5A0\",\"#FEDEB2\",\"#FDD5A1\",\"#F4744E\",\"#B60502\",\"#FDC18A\",\"#FDD8A6\",\"#FEE2BB\",\"#FDC18A\",\"#FDCF99\",\"#808080\",\"#FEEBCF\",\"#FEE5C1\",\"#808080\",\"#FDBD86\",\"#808080\",\"#FDA770\",\"#FEDEB3\",\"#FD9A65\",\"#FEEACC\",\"#FDC993\",\"#FED9A8\",\"#F88154\",\"#FD9B66\",\"#FD9B66\",\"#FDD19A\",\"#FDCC95\",\"#B20000\",\"#FEE8C9\",\"#FDBB84\",\"#FDC08A\",\"#E0452D\",\"#FEE3BD\",\"#FDBF88\",\"#FDC28B\",\"#EF6649\",\"#EF6548\",\"#FC915D\",\"#FDB07A\",\"#BE1509\",\"#FC935E\",\"#F5774F\",\"#FDC992\",\"#FFF4E4\",\"#F87F53\",\"#FDD09A\",\"#FDBA83\",\"#FDA56F\"],\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"addLegend\",\"args\":[{\"colors\":[\"#FFF7EC , #FEE5C2 14.3851543342441%, #FDCA94 29.9759285027722%, #FD9E68 45.5667026713002%, #F06A4A 61.1574768398283%, #D22B1B 76.7482510083563%, #9E0001 92.3390251768844%, #7F0000 \"],\"labels\":[\"0.5\",\"1.0\",\"1.5\",\"2.0\",\"2.5\",\"3.0\"],\"na_color\":\"#808080\",\"na_label\":\"NA\",\"opacity\":0.5,\"position\":\"bottomleft\",\"type\":\"numeric\",\"title\":\"z\",\"extra\":{\"p_1\":0.143851543342441,\"p_n\":0.9233902517688439},\"layerId\":null,\"className\":\"info legend\",\"group\":\"circles\"}]},{\"method\":\"addLayersControl\",\"args\":[[],\"circles\",{\"collapsed\":true,\"autoZIndex\":true,\"position\":\"topright\"}]}],\"limits\":{\"lat\":[-2.938977561072442,2.654898332699442],\"lng\":[-2.612334332884302,2.755417575336856]}},\"evals\":[],\"jsHooks\":[]} # format legend labels df <- data.frame(x = rnorm(100), y = rexp(100, 2), z = runif(100)) pal <- colorBin(\"PuOr\", df$z, bins = c(0, .1, .4, .9, 1)) leaflet(df) %>% addTiles() %>% addCircleMarkers(~x, ~y, color = ~pal(z), group = \"circles\") %>% addLegend(pal = pal, values = ~z, group = \"circles\", position = \"bottomleft\") %>% addLayersControl(overlayGroups = c(\"circles\")) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[0.2692867037840188,0.212140791118145,1.046658438567388,0.3771682899839398,0.7106290954412665,0.1942461444996297,0.8639515353814833,0.2232086854055524,0.355275936546519,0.0486942364233251,0.6987547361803176,0.3356562776025385,0.442932598271823,0.6092310901521207,0.8127087093011401,0.05220129252725467,0.1518081404274,0.4055381689620911,0.8355899462056281,0.16139040957205,0.5355923452525414,0.02548254048451781,0.118936445331201,0.9089908264157297,0.2677212303970009,0.3162949671968818,0.9714767001149179,0.7793851283228252,0.6610611132136048,0.0616738076787442,0.2505097503308207,0.05119776749052107,0.3682794489907571,0.08018261892721057,0.6179253337694766,0.8732052031709832,0.329900240059942,0.2236487014266211,0.283117612125352,1.510493000083978,0.2230917664710432,0.1964026989880949,0.1229662053393779,0.3072527183685452,0.5521513232751252,0.2531260862015188,0.0763318418700733,1.481209669178152,0.1980540752410889,0.7924832375300052,0.04243761277757585,0.2967723628971726,0.2196246690582484,0.2281896565109491,1.65135294190588,0.6218465812105742,1.02935343138398,0.865973314228368,0.05256699976437223,0.6321182833876893,0.4373919181315661,0.7279335062432883,0.5070243114395501,0.9635419882413866,0.3843208630359233,0.02575771917139133,0.1853092038072646,0.1008155907038599,0.2061404753476381,0.3503817180015383,0.1218532985076308,0.1127746735468033,0.02791473780559238,0.456631548216051,0.2363630407489836,0.1262117471246489,0.2223208614583135,0.2954503307119012,0.1924614944362566,0.1079764253084629,0.05515212402679026,0.1173610113607709,0.2696835622191429,0.4492581952153207,0.1296409552451223,0.3024997254833579,0.04223556397482753,0.1309975676704198,0.9523026616823794,1.006957940715266,0.04539070327624838,1.591538189183535,0.01239299867302179,0.4387108953459621,0.1397780675906688,0.2458650845141725,0.005621975288390082,0.7774760597641138,0.01505035441368818,0.01405656595920493],[-0.3984334782151365,-0.6007732862438636,-0.2098360075316202,0.4855063597277793,1.428969096463668,-0.4799556879769412,1.295198373718015,0.1650741495529123,0.3254972433419994,-0.5667226199339622,-1.050572186377197,-0.9463067128475058,-0.07517995897755188,0.1879264971469662,1.249107639432808,-0.5487269009214932,-1.710331134449975,-0.7009859775934013,1.89782704307245,1.114268604967617,0.8469617515788301,0.3908726017543429,1.053655337491501,-0.5554842557687424,-0.6294126759023519,0.303364542094377,-0.03803220194126955,1.76272950235461,0.6146292893964426,-1.660586791892282,-1.048458093797681,-0.9293644974648377,1.541006628726101,0.1792863811621108,-1.344940376000263,-0.7489042769106593,-0.9894249452328882,-0.8479671835686403,-0.9102960395242335,0.4099617962566627,-2.820052041034497,0.3252107784999188,-0.8232665308569107,-0.09100569714754379,0.4940551581799212,1.041615594565685,0.09354926547536348,-0.5219444445390135,-0.5099417583845377,0.5782052207077775,-2.067161490114969,0.5308857761276942,-1.797446708323689,-0.324496483339947,-0.0202597104750414,0.4964312305581562,-0.3164416135452041,1.668848910482331,-0.1430423975180836,1.595746692557468,-0.1114377754631172,-1.084000074326908,-0.2386753429291021,-1.95882983800578,0.6190932730090485,0.3341261167269697,-1.04205906405728,1.039254510609248,-0.6656110074318481,0.8034733706349627,-1.517319718023491,-0.8383098544417419,0.3955461782178744,0.2445431280573691,2.617296949103566,-0.737876447294739,0.5842284108273538,-1.23887255805986,-0.8900996817323477,-1.510025371518169,-0.5851823983797985,-1.553675841820956,-0.5760951492856244,1.226974959089384,0.4612446431625483,-1.074960989560614,-0.2496090257594738,-0.4884538935375984,0.4662626992638065,0.2233549008401526,-0.5657644940993514,0.1276178485048165,0.3680300362657145,0.6089351089176784,0.9146069464284257,0.495767250160165,0.3770415841379589,-1.14818247054384,0.9416994572493231,0.9987979591905438],10,null,\"circles\",{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":[\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#E66101\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#5E3C99\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#E66101\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#E66101\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#E66101\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#5E3C99\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#E66101\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#E66101\"],\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"addLegend\",\"args\":[{\"colors\":[\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\"],\"labels\":[\"0.0 – 0.1\",\"0.1 – 0.4\",\"0.4 – 0.9\",\"0.9 – 1.0\"],\"na_color\":null,\"na_label\":\"NA\",\"opacity\":0.5,\"position\":\"bottomleft\",\"type\":\"bin\",\"title\":\"z\",\"extra\":null,\"layerId\":null,\"className\":\"info legend\",\"group\":\"circles\"}]},{\"method\":\"addLayersControl\",\"args\":[[],\"circles\",{\"collapsed\":true,\"autoZIndex\":true,\"position\":\"topright\"}]}],\"limits\":{\"lat\":[0.005621975288390082,1.65135294190588],\"lng\":[-2.820052041034497,2.617296949103566]}},\"evals\":[],\"jsHooks\":[]} leaflet(df) %>% addTiles() %>% addCircleMarkers(~x, ~y, color = ~pal(z), group = \"circles\") %>% addLegend(pal = pal, values = ~z, labFormat = labelFormat( prefix = \"(\", suffix = \")%\", between = \", \", transform = function(x) 100 * x ), group = \"circles\", position = \"bottomleft\" ) %>% addLayersControl(overlayGroups = c(\"circles\")) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[0.2692867037840188,0.212140791118145,1.046658438567388,0.3771682899839398,0.7106290954412665,0.1942461444996297,0.8639515353814833,0.2232086854055524,0.355275936546519,0.0486942364233251,0.6987547361803176,0.3356562776025385,0.442932598271823,0.6092310901521207,0.8127087093011401,0.05220129252725467,0.1518081404274,0.4055381689620911,0.8355899462056281,0.16139040957205,0.5355923452525414,0.02548254048451781,0.118936445331201,0.9089908264157297,0.2677212303970009,0.3162949671968818,0.9714767001149179,0.7793851283228252,0.6610611132136048,0.0616738076787442,0.2505097503308207,0.05119776749052107,0.3682794489907571,0.08018261892721057,0.6179253337694766,0.8732052031709832,0.329900240059942,0.2236487014266211,0.283117612125352,1.510493000083978,0.2230917664710432,0.1964026989880949,0.1229662053393779,0.3072527183685452,0.5521513232751252,0.2531260862015188,0.0763318418700733,1.481209669178152,0.1980540752410889,0.7924832375300052,0.04243761277757585,0.2967723628971726,0.2196246690582484,0.2281896565109491,1.65135294190588,0.6218465812105742,1.02935343138398,0.865973314228368,0.05256699976437223,0.6321182833876893,0.4373919181315661,0.7279335062432883,0.5070243114395501,0.9635419882413866,0.3843208630359233,0.02575771917139133,0.1853092038072646,0.1008155907038599,0.2061404753476381,0.3503817180015383,0.1218532985076308,0.1127746735468033,0.02791473780559238,0.456631548216051,0.2363630407489836,0.1262117471246489,0.2223208614583135,0.2954503307119012,0.1924614944362566,0.1079764253084629,0.05515212402679026,0.1173610113607709,0.2696835622191429,0.4492581952153207,0.1296409552451223,0.3024997254833579,0.04223556397482753,0.1309975676704198,0.9523026616823794,1.006957940715266,0.04539070327624838,1.591538189183535,0.01239299867302179,0.4387108953459621,0.1397780675906688,0.2458650845141725,0.005621975288390082,0.7774760597641138,0.01505035441368818,0.01405656595920493],[-0.3984334782151365,-0.6007732862438636,-0.2098360075316202,0.4855063597277793,1.428969096463668,-0.4799556879769412,1.295198373718015,0.1650741495529123,0.3254972433419994,-0.5667226199339622,-1.050572186377197,-0.9463067128475058,-0.07517995897755188,0.1879264971469662,1.249107639432808,-0.5487269009214932,-1.710331134449975,-0.7009859775934013,1.89782704307245,1.114268604967617,0.8469617515788301,0.3908726017543429,1.053655337491501,-0.5554842557687424,-0.6294126759023519,0.303364542094377,-0.03803220194126955,1.76272950235461,0.6146292893964426,-1.660586791892282,-1.048458093797681,-0.9293644974648377,1.541006628726101,0.1792863811621108,-1.344940376000263,-0.7489042769106593,-0.9894249452328882,-0.8479671835686403,-0.9102960395242335,0.4099617962566627,-2.820052041034497,0.3252107784999188,-0.8232665308569107,-0.09100569714754379,0.4940551581799212,1.041615594565685,0.09354926547536348,-0.5219444445390135,-0.5099417583845377,0.5782052207077775,-2.067161490114969,0.5308857761276942,-1.797446708323689,-0.324496483339947,-0.0202597104750414,0.4964312305581562,-0.3164416135452041,1.668848910482331,-0.1430423975180836,1.595746692557468,-0.1114377754631172,-1.084000074326908,-0.2386753429291021,-1.95882983800578,0.6190932730090485,0.3341261167269697,-1.04205906405728,1.039254510609248,-0.6656110074318481,0.8034733706349627,-1.517319718023491,-0.8383098544417419,0.3955461782178744,0.2445431280573691,2.617296949103566,-0.737876447294739,0.5842284108273538,-1.23887255805986,-0.8900996817323477,-1.510025371518169,-0.5851823983797985,-1.553675841820956,-0.5760951492856244,1.226974959089384,0.4612446431625483,-1.074960989560614,-0.2496090257594738,-0.4884538935375984,0.4662626992638065,0.2233549008401526,-0.5657644940993514,0.1276178485048165,0.3680300362657145,0.6089351089176784,0.9146069464284257,0.495767250160165,0.3770415841379589,-1.14818247054384,0.9416994572493231,0.9987979591905438],10,null,\"circles\",{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":[\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#E66101\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#5E3C99\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#E66101\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#E66101\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#E66101\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#5E3C99\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#E66101\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#E66101\"],\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"addLegend\",\"args\":[{\"colors\":[\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\"],\"labels\":[\"(0, 10)%\",\"(10, 40)%\",\"(40, 90)%\",\"(90, 100)%\"],\"na_color\":null,\"na_label\":\"NA\",\"opacity\":0.5,\"position\":\"bottomleft\",\"type\":\"bin\",\"title\":\"z\",\"extra\":null,\"layerId\":null,\"className\":\"info legend\",\"group\":\"circles\"}]},{\"method\":\"addLayersControl\",\"args\":[[],\"circles\",{\"collapsed\":true,\"autoZIndex\":true,\"position\":\"topright\"}]}],\"limits\":{\"lat\":[0.005621975288390082,1.65135294190588],\"lng\":[-2.820052041034497,2.617296949103566]}},\"evals\":[],\"jsHooks\":[]}# }"},{"path":"https://rstudio.github.io/leaflet/reference/addMapPane.html","id":null,"dir":"Reference","previous_headings":"","what":"Add additional panes to leaflet map to control layer order — addMapPane","title":"Add additional panes to leaflet map to control layer order — addMapPane","text":"map panes can created supplying name zIndex control layer ordering. recommend zIndex value 400 (default overlay pane) 500 (default shadow pane). can use pane render overlays (points, lines, polygons) setting pane argument leafletOptions(). give control order layers, e.g., points always top polygons. two layers provided pane, overlay determined order adding. See examples . See https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#map-pane details. error \"read property 'appendChild' undefined\" occurs, make sure pane used used display already added map.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMapPane.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add additional panes to leaflet map to control layer order — addMapPane","text":"","code":"addMapPane(map, name, zIndex)"},{"path":"https://rstudio.github.io/leaflet/reference/addMapPane.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add additional panes to leaflet map to control layer order — addMapPane","text":"map leaflet mapview object. name name new pane (refer leafletOptions(). zIndex zIndex pane. Panes higher index rendered panes lower indices.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMapPane.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add additional panes to leaflet map to control layer order — addMapPane","text":"","code":"rand_lng <- function(n = 10) rnorm(n, -93.65, .01) rand_lat <- function(n = 10) rnorm(n, 42.0285, .01) random_data <- data.frame( lng = rand_lng(50), lat = rand_lat(50), radius = runif(50, 50, 150), circleId = paste0(\"circle #\", 1:50), lineId = paste0(\"circle #\", 1:50) ) # display circles (zIndex: 420) above the lines (zIndex: 410), even when added first leaflet() %>% addTiles() %>% # move the center to Snedecor Hall setView(-93.65, 42.0285, zoom = 14) %>% addMapPane(\"ames_lines\", zIndex = 410) %>% # shown below ames_circles addMapPane(\"ames_circles\", zIndex = 420) %>% # shown above ames_lines # points above polygons addCircles( data = random_data, ~lng, ~lat, radius = ~radius, popup = ~circleId, options = pathOptions(pane = \"ames_circles\") ) %>% # lines in 'ames_lines' pane addPolylines( data = random_data, ~lng, ~lat, color = \"#F00\", weight = 20, options = pathOptions(pane = \"ames_lines\") ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"createMapPane\",\"args\":[\"ames_lines\",410]},{\"method\":\"createMapPane\",\"args\":[\"ames_circles\",420]},{\"method\":\"addCircles\",\"args\":[[42.02192942589536,42.02368217749863,42.02867757878648,42.0199046424421,42.04207704976999,42.04065061176793,42.04303912917111,42.02764088018438,42.0223243124986,42.0263173975076,42.01523994788681,42.00487791103354,42.01440030446491,42.03104397135973,42.03145870299451,42.02906789793922,42.02747345143391,42.0480192303197,42.03728565956003,42.01543383072165,42.02940344271749,42.03752358039835,42.03399421324455,42.01980160799815,42.0281078535213,42.02331548317503,42.01938150382963,42.03000313640027,42.03290355448512,42.04169782058712,42.03096561126368,42.03791826599055,42.02507848668304,42.02573853189486,42.03233656779902,42.04296910224745,42.0458390029055,42.03306429375908,42.03557503489859,42.04913789223756,42.02873910586354,42.03095949460654,42.03122059144599,42.0185754142301,42.028224220487,42.05072845163442,42.03005503899382,42.01980883681512,42.01675510550265,42.01090322692944],[-93.6591592053706,-93.64926732536468,-93.63761828681986,-93.64281628663736,-93.64460533504963,-93.66061233994861,-93.65540737865916,-93.65715204714398,-93.65178920085494,-93.648350297232,-93.65727408166417,-93.6553783712891,-93.65599664903726,-93.63817912245925,-93.64810787124613,-93.6475105088615,-93.63953356588844,-93.66289300936155,-93.64624884429701,-93.65556918390979,-93.64697573369997,-93.64777733534012,-93.65962166963084,-93.64947967630992,-93.64099959618093,-93.65394900880048,-93.64045854004274,-93.65588214347524,-93.6647658452661,-93.66377775769931,-93.66345672313354,-93.65736637962176,-93.65470111495641,-93.63619390662468,-93.63324989071721,-93.63823093366396,-93.65148898335575,-93.65177823364408,-93.6419687814204,-93.65415795348841,-93.63787510414093,-93.63759639967583,-93.64314324119998,-93.65026798678019,-93.64690419491062,-93.64750135671832,-93.66356460868913,-93.64400620232379,-93.64991352209502,-93.6490928338968],[102.3269695229828,89.31053976994008,137.7893300261348,78.82499238476157,113.2178187603131,81.3025128794834,64.58227424882352,132.0500965928659,124.5619802735746,117.7873467095196,70.51377177704126,149.1973087890074,116.8956527952105,125.3881895681843,114.5198054146022,60.51661607343704,54.98048129957169,105.0795055227354,52.72053678054363,68.72580656781793,114.8336424026638,132.4718985240906,141.554355667904,132.5556990224868,129.5555043732747,118.8114724587649,83.86629270389676,96.83029074221849,133.6986915674061,127.0487755769864,109.5679931808263,109.6528243506327,67.41410011891276,97.56676240358502,143.3948250720277,55.95374803524464,64.32454616297036,92.67803230322897,106.4453589962795,68.72994224540889,110.2749522775412,123.487829323858,56.83488131035119,128.2917964272201,142.1492709312588,54.42821667529643,121.3114854646847,140.3886020416394,123.9581503905356,67.21756304614246],null,null,{\"interactive\":true,\"className\":\"\",\"pane\":\"ames_circles\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2},[\"circle #1\",\"circle #2\",\"circle #3\",\"circle #4\",\"circle #5\",\"circle #6\",\"circle #7\",\"circle #8\",\"circle #9\",\"circle #10\",\"circle #11\",\"circle #12\",\"circle #13\",\"circle #14\",\"circle #15\",\"circle #16\",\"circle #17\",\"circle #18\",\"circle #19\",\"circle #20\",\"circle #21\",\"circle #22\",\"circle #23\",\"circle #24\",\"circle #25\",\"circle #26\",\"circle #27\",\"circle #28\",\"circle #29\",\"circle #30\",\"circle #31\",\"circle #32\",\"circle #33\",\"circle #34\",\"circle #35\",\"circle #36\",\"circle #37\",\"circle #38\",\"circle #39\",\"circle #40\",\"circle #41\",\"circle #42\",\"circle #43\",\"circle #44\",\"circle #45\",\"circle #46\",\"circle #47\",\"circle #48\",\"circle #49\",\"circle #50\"],null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null,null]},{\"method\":\"addPolylines\",\"args\":[[[[{\"lng\":[-93.6591592053706,-93.64926732536468,-93.63761828681986,-93.64281628663736,-93.64460533504963,-93.66061233994861,-93.65540737865916,-93.65715204714398,-93.65178920085494,-93.648350297232,-93.65727408166417,-93.6553783712891,-93.65599664903726,-93.63817912245925,-93.64810787124613,-93.6475105088615,-93.63953356588844,-93.66289300936155,-93.64624884429701,-93.65556918390979,-93.64697573369997,-93.64777733534012,-93.65962166963084,-93.64947967630992,-93.64099959618093,-93.65394900880048,-93.64045854004274,-93.65588214347524,-93.6647658452661,-93.66377775769931,-93.66345672313354,-93.65736637962176,-93.65470111495641,-93.63619390662468,-93.63324989071721,-93.63823093366396,-93.65148898335575,-93.65177823364408,-93.6419687814204,-93.65415795348841,-93.63787510414093,-93.63759639967583,-93.64314324119998,-93.65026798678019,-93.64690419491062,-93.64750135671832,-93.66356460868913,-93.64400620232379,-93.64991352209502,-93.6490928338968],\"lat\":[42.02192942589536,42.02368217749863,42.02867757878648,42.0199046424421,42.04207704976999,42.04065061176793,42.04303912917111,42.02764088018438,42.0223243124986,42.0263173975076,42.01523994788681,42.00487791103354,42.01440030446491,42.03104397135973,42.03145870299451,42.02906789793922,42.02747345143391,42.0480192303197,42.03728565956003,42.01543383072165,42.02940344271749,42.03752358039835,42.03399421324455,42.01980160799815,42.0281078535213,42.02331548317503,42.01938150382963,42.03000313640027,42.03290355448512,42.04169782058712,42.03096561126368,42.03791826599055,42.02507848668304,42.02573853189486,42.03233656779902,42.04296910224745,42.0458390029055,42.03306429375908,42.03557503489859,42.04913789223756,42.02873910586354,42.03095949460654,42.03122059144599,42.0185754142301,42.028224220487,42.05072845163442,42.03005503899382,42.01980883681512,42.01675510550265,42.01090322692944]}]]],null,null,{\"interactive\":true,\"className\":\"\",\"pane\":\"ames_lines\",\"stroke\":true,\"color\":\"#F00\",\"weight\":20,\"opacity\":0.5,\"fill\":false,\"fillColor\":\"#F00\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"setView\":[[42.0285,-93.65000000000001],14,[]],\"limits\":{\"lat\":[42.00487791103354,42.05072845163442],\"lng\":[-93.6647658452661,-93.63324989071721]}},\"evals\":[],\"jsHooks\":[]} # same example but circles (zIndex: 420) are below the lines (zIndex: 430) leaflet() %>% addTiles() %>% # move the center to Snedecor Hall setView(-93.65, 42.0285, zoom = 14) %>% addMapPane(\"ames_lines\", zIndex = 430) %>% # shown below ames_circles addMapPane(\"ames_circles\", zIndex = 420) %>% # shown above ames_lines # points above polygons addCircles( data = random_data, ~lng, ~lat, radius = ~radius, popup = ~circleId, options = pathOptions(pane = \"ames_circles\") ) %>% # lines in 'ames_lines' pane addPolylines( data = random_data, ~lng, ~lat, color = \"#F00\", weight = 20, options = pathOptions(pane = \"ames_lines\") ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"createMapPane\",\"args\":[\"ames_lines\",430]},{\"method\":\"createMapPane\",\"args\":[\"ames_circles\",420]},{\"method\":\"addCircles\",\"args\":[[42.02192942589536,42.02368217749863,42.02867757878648,42.0199046424421,42.04207704976999,42.04065061176793,42.04303912917111,42.02764088018438,42.0223243124986,42.0263173975076,42.01523994788681,42.00487791103354,42.01440030446491,42.03104397135973,42.03145870299451,42.02906789793922,42.02747345143391,42.0480192303197,42.03728565956003,42.01543383072165,42.02940344271749,42.03752358039835,42.03399421324455,42.01980160799815,42.0281078535213,42.02331548317503,42.01938150382963,42.03000313640027,42.03290355448512,42.04169782058712,42.03096561126368,42.03791826599055,42.02507848668304,42.02573853189486,42.03233656779902,42.04296910224745,42.0458390029055,42.03306429375908,42.03557503489859,42.04913789223756,42.02873910586354,42.03095949460654,42.03122059144599,42.0185754142301,42.028224220487,42.05072845163442,42.03005503899382,42.01980883681512,42.01675510550265,42.01090322692944],[-93.6591592053706,-93.64926732536468,-93.63761828681986,-93.64281628663736,-93.64460533504963,-93.66061233994861,-93.65540737865916,-93.65715204714398,-93.65178920085494,-93.648350297232,-93.65727408166417,-93.6553783712891,-93.65599664903726,-93.63817912245925,-93.64810787124613,-93.6475105088615,-93.63953356588844,-93.66289300936155,-93.64624884429701,-93.65556918390979,-93.64697573369997,-93.64777733534012,-93.65962166963084,-93.64947967630992,-93.64099959618093,-93.65394900880048,-93.64045854004274,-93.65588214347524,-93.6647658452661,-93.66377775769931,-93.66345672313354,-93.65736637962176,-93.65470111495641,-93.63619390662468,-93.63324989071721,-93.63823093366396,-93.65148898335575,-93.65177823364408,-93.6419687814204,-93.65415795348841,-93.63787510414093,-93.63759639967583,-93.64314324119998,-93.65026798678019,-93.64690419491062,-93.64750135671832,-93.66356460868913,-93.64400620232379,-93.64991352209502,-93.6490928338968],[102.3269695229828,89.31053976994008,137.7893300261348,78.82499238476157,113.2178187603131,81.3025128794834,64.58227424882352,132.0500965928659,124.5619802735746,117.7873467095196,70.51377177704126,149.1973087890074,116.8956527952105,125.3881895681843,114.5198054146022,60.51661607343704,54.98048129957169,105.0795055227354,52.72053678054363,68.72580656781793,114.8336424026638,132.4718985240906,141.554355667904,132.5556990224868,129.5555043732747,118.8114724587649,83.86629270389676,96.83029074221849,133.6986915674061,127.0487755769864,109.5679931808263,109.6528243506327,67.41410011891276,97.56676240358502,143.3948250720277,55.95374803524464,64.32454616297036,92.67803230322897,106.4453589962795,68.72994224540889,110.2749522775412,123.487829323858,56.83488131035119,128.2917964272201,142.1492709312588,54.42821667529643,121.3114854646847,140.3886020416394,123.9581503905356,67.21756304614246],null,null,{\"interactive\":true,\"className\":\"\",\"pane\":\"ames_circles\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2},[\"circle #1\",\"circle #2\",\"circle #3\",\"circle #4\",\"circle #5\",\"circle #6\",\"circle #7\",\"circle #8\",\"circle #9\",\"circle #10\",\"circle #11\",\"circle #12\",\"circle #13\",\"circle #14\",\"circle #15\",\"circle #16\",\"circle #17\",\"circle #18\",\"circle #19\",\"circle #20\",\"circle #21\",\"circle #22\",\"circle #23\",\"circle #24\",\"circle #25\",\"circle #26\",\"circle #27\",\"circle #28\",\"circle #29\",\"circle #30\",\"circle #31\",\"circle #32\",\"circle #33\",\"circle #34\",\"circle #35\",\"circle #36\",\"circle #37\",\"circle #38\",\"circle #39\",\"circle #40\",\"circle #41\",\"circle #42\",\"circle #43\",\"circle #44\",\"circle #45\",\"circle #46\",\"circle #47\",\"circle #48\",\"circle #49\",\"circle #50\"],null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null,null]},{\"method\":\"addPolylines\",\"args\":[[[[{\"lng\":[-93.6591592053706,-93.64926732536468,-93.63761828681986,-93.64281628663736,-93.64460533504963,-93.66061233994861,-93.65540737865916,-93.65715204714398,-93.65178920085494,-93.648350297232,-93.65727408166417,-93.6553783712891,-93.65599664903726,-93.63817912245925,-93.64810787124613,-93.6475105088615,-93.63953356588844,-93.66289300936155,-93.64624884429701,-93.65556918390979,-93.64697573369997,-93.64777733534012,-93.65962166963084,-93.64947967630992,-93.64099959618093,-93.65394900880048,-93.64045854004274,-93.65588214347524,-93.6647658452661,-93.66377775769931,-93.66345672313354,-93.65736637962176,-93.65470111495641,-93.63619390662468,-93.63324989071721,-93.63823093366396,-93.65148898335575,-93.65177823364408,-93.6419687814204,-93.65415795348841,-93.63787510414093,-93.63759639967583,-93.64314324119998,-93.65026798678019,-93.64690419491062,-93.64750135671832,-93.66356460868913,-93.64400620232379,-93.64991352209502,-93.6490928338968],\"lat\":[42.02192942589536,42.02368217749863,42.02867757878648,42.0199046424421,42.04207704976999,42.04065061176793,42.04303912917111,42.02764088018438,42.0223243124986,42.0263173975076,42.01523994788681,42.00487791103354,42.01440030446491,42.03104397135973,42.03145870299451,42.02906789793922,42.02747345143391,42.0480192303197,42.03728565956003,42.01543383072165,42.02940344271749,42.03752358039835,42.03399421324455,42.01980160799815,42.0281078535213,42.02331548317503,42.01938150382963,42.03000313640027,42.03290355448512,42.04169782058712,42.03096561126368,42.03791826599055,42.02507848668304,42.02573853189486,42.03233656779902,42.04296910224745,42.0458390029055,42.03306429375908,42.03557503489859,42.04913789223756,42.02873910586354,42.03095949460654,42.03122059144599,42.0185754142301,42.028224220487,42.05072845163442,42.03005503899382,42.01980883681512,42.01675510550265,42.01090322692944]}]]],null,null,{\"interactive\":true,\"className\":\"\",\"pane\":\"ames_lines\",\"stroke\":true,\"color\":\"#F00\",\"weight\":20,\"opacity\":0.5,\"fill\":false,\"fillColor\":\"#F00\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"setView\":[[42.0285,-93.65000000000001],14,[]],\"limits\":{\"lat\":[42.00487791103354,42.05072845163442],\"lng\":[-93.6647658452661,-93.63324989071721]}},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addMeasure.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a measure control to the map. — addMeasure","title":"Add a measure control to the map. — addMeasure","text":"Add measure control map.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMeasure.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a measure control to the map. — addMeasure","text":"","code":"addMeasure( map, position = \"topright\", primaryLengthUnit = \"feet\", secondaryLengthUnit = NULL, primaryAreaUnit = \"acres\", secondaryAreaUnit = NULL, activeColor = \"#ABE67E\", completedColor = \"#C8F2BE\", popupOptions = list(className = \"leaflet-measure-resultpopup\", autoPanPadding = c(10, 10)), captureZIndex = 10000, localization = \"en\", decPoint = \".\", thousandsSep = \",\" )"},{"path":"https://rstudio.github.io/leaflet/reference/addMeasure.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a measure control to the map. — addMeasure","text":"map map widget object position standard Leaflet control position options. primaryLengthUnit, secondaryLengthUnit units used display length results. secondaryLengthUnit optional. Valid values \"feet\", \"meters\", \"miles\", \"kilometers\". primaryAreaUnit, secondaryAreaUnit units used display area results. secondaryAreaUnit optional. Valid values \"acres\", \"hectares\", \"sqmeters\", \"sqmiles\". activeColor base color use map features rendered actively performing measurement. Value color represented hexadecimal string. completedColor base color use features generated completed measurement. Value color represented hexadecimal string. popupOptions list options applied popup resulting measure feature. Properties may standard Leaflet popup options. captureZIndex Z-index marker used capture measure clicks. Set value higher z-index map layers disable click events layers measurement active. localization Locale translate displayed text. Available locales include en (default), cn, de, es, fr, , nl, pt, pt_BR, pt_PT, ru, tr decPoint Decimal point used displaying measurements. specified, values defined localization. thousandsSep Thousands separator used displaying measurements. specified, values defined localization.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMeasure.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Add a measure control to the map. — addMeasure","text":"modified map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMeasure.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a measure control to the map. — addMeasure","text":"","code":"leaf <- leaflet() %>% addTiles() %>% # central park fitBounds( -73.9, 40.75, -73.95, 40.8 ) %>% addMeasure() leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMeasure\",\"args\":[{\"position\":\"topright\",\"primaryLengthUnit\":\"feet\",\"primaryAreaUnit\":\"acres\",\"activeColor\":\"#ABE67E\",\"completedColor\":\"#C8F2BE\",\"popupOptions\":{\"className\":\"leaflet-measure-resultpopup\",\"autoPanPadding\":[10,10]},\"captureZIndex\":10000,\"localization\":\"en\",\"decPoint\":\".\",\"thousandsSep\":\",\"}]}],\"fitBounds\":[40.75,-73.90000000000001,40.8,-73.95,[]]},\"evals\":[],\"jsHooks\":[]} # customizing leaf %>% addMeasure( position = \"bottomleft\", primaryLengthUnit = \"meters\", primaryAreaUnit = \"sqmeters\", activeColor = \"#3D535D\", completedColor = \"#7D4479\", localization = \"de\" ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMeasure\",\"args\":[{\"position\":\"topright\",\"primaryLengthUnit\":\"feet\",\"primaryAreaUnit\":\"acres\",\"activeColor\":\"#ABE67E\",\"completedColor\":\"#C8F2BE\",\"popupOptions\":{\"className\":\"leaflet-measure-resultpopup\",\"autoPanPadding\":[10,10]},\"captureZIndex\":10000,\"localization\":\"en\",\"decPoint\":\".\",\"thousandsSep\":\",\"}]},{\"method\":\"addMeasure\",\"args\":[{\"position\":\"bottomleft\",\"primaryLengthUnit\":\"meters\",\"primaryAreaUnit\":\"sqmeters\",\"activeColor\":\"#3D535D\",\"completedColor\":\"#7D4479\",\"popupOptions\":{\"className\":\"leaflet-measure-resultpopup\",\"autoPanPadding\":[10,10]},\"captureZIndex\":10000,\"localization\":\"de\",\"decPoint\":\".\",\"thousandsSep\":\",\"}]}],\"fitBounds\":[40.75,-73.90000000000001,40.8,-73.95,[]]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addMiniMap.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a minimap to the map — addMiniMap","title":"Add a minimap to the map — addMiniMap","text":"Add minimap map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMiniMap.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a minimap to the map — addMiniMap","text":"","code":"addMiniMap( map, position = \"bottomright\", width = 150, height = 150, collapsedWidth = 19, collapsedHeight = 19, zoomLevelOffset = -5, zoomLevelFixed = FALSE, centerFixed = FALSE, zoomAnimation = FALSE, toggleDisplay = FALSE, autoToggleDisplay = FALSE, minimized = FALSE, aimingRectOptions = list(color = \"#ff7800\", weight = 1, clickable = FALSE), shadowRectOptions = list(color = \"#000000\", weight = 1, clickable = FALSE, opacity = 0, fillOpacity = 0), strings = list(hideText = \"Hide MiniMap\", showText = \"Show MiniMap\"), tiles = NULL, mapOptions = list() )"},{"path":"https://rstudio.github.io/leaflet/reference/addMiniMap.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a minimap to the map — addMiniMap","text":"map map widget object position standard Leaflet.Control position parameter, used like controls. Defaults \"bottomright\". width width minimap pixels. Defaults 150. height height minimap pixels. Defaults 150. collapsedWidth width toggle marker minimap collapsed, pixels. Defaults 19. collapsedHeight height toggle marker minimap collapsed, pixels. Defaults 19. zoomLevelOffset offset applied zoom minimap compared zoom main map. Can positive negative, defaults -5. zoomLevelFixed Overrides offset apply fixed zoom level minimap regardless main map zoom. Set valid zoom level, unset zoomLevelOffset used instead. centerFixed Applies fixed position minimap regardless main map's view / position. Prevents panning minimap, allow zooming (minimap main map). minimap zoomed, always zoom around centerFixed point. can pass LatLng-equivalent object. Defaults false. zoomAnimation Sets whether minimap animated zoom. (cause lag bit movement main map.) Defaults false. toggleDisplay Sets whether minimap button minimize . Defaults false. autoToggleDisplay Sets whether minimap hide automatically, parent map bounds fit within minimap bounds. Especially useful 'zoomLevelFixed' set. minimized Sets whether minimap start minimized position. aimingRectOptions Sets style aiming rectangle passing Path.Options (https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#path-options) object. (Clickable always overridden set false.) shadowRectOptions Sets style aiming shadow rectangle passing Path.Options (https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#path-option) object. (Clickable always overridden set false.) strings Overrides default strings allowing translation. tiles URL tiles one pre-defined providers. mapOptions Sets Leaflet options MiniMap map. override MiniMap default map options extends .","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/addMiniMap.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a minimap to the map — addMiniMap","text":"","code":"leaf <- leaflet() %>% addTiles() %>% addMiniMap() leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMiniMap\",\"args\":[null,null,\"bottomright\",150,150,19,19,-5,false,false,false,false,false,false,{\"color\":\"#ff7800\",\"weight\":1,\"clickable\":false},{\"color\":\"#000000\",\"weight\":1,\"clickable\":false,\"opacity\":0,\"fillOpacity\":0},{\"hideText\":\"Hide MiniMap\",\"showText\":\"Show MiniMap\"},[]]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addProviderTiles.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a tile layer from a known map provider — addProviderTiles","title":"Add a tile layer from a known map provider — addProviderTiles","text":"Add tile layer known map provider","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addProviderTiles.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a tile layer from a known map provider — addProviderTiles","text":"","code":"addProviderTiles( map, provider, layerId = NULL, group = NULL, options = providerTileOptions() ) providerTileOptions( errorTileUrl = \"\", noWrap = FALSE, opacity = NULL, zIndex = NULL, updateWhenIdle = NULL, detectRetina = FALSE, ... )"},{"path":"https://rstudio.github.io/leaflet/reference/addProviderTiles.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a tile layer from a known map provider — addProviderTiles","text":"map map add tile layer provider name provider (see https://leaflet-extras.github.io/leaflet-providers/preview/ https://github.com/leaflet-extras/leaflet-providers) layerId layer id assign group name group newly created layers belong (clearGroup() addLayersControl() purposes). Human-friendly group names permitted–need short, identifier-style names. options tile options errorTileUrl, noWrap, opacity, zIndex, updateWhenIdle, detectRetina tile layer options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tilelayer ... named parameters add options","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addProviderTiles.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Add a tile layer from a known map provider — addProviderTiles","text":"modified map object","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addProviderTiles.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a tile layer from a known map provider — addProviderTiles","text":"","code":"leaflet() %>% addProviderTiles(\"Esri.WorldTopoMap\") %>% addProviderTiles(\"CartoDB.DarkMatter\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addProviderTiles\",\"args\":[\"Esri.WorldTopoMap\",null,null,{\"errorTileUrl\":\"\",\"noWrap\":false,\"detectRetina\":false}]},{\"method\":\"addProviderTiles\",\"args\":[\"CartoDB.DarkMatter\",null,null,{\"errorTileUrl\":\"\",\"noWrap\":false,\"detectRetina\":false}]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addRasterImage.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a raster image as a layer — addRasterImage","title":"Add a raster image as a layer — addRasterImage","text":"Create image overlay RasterLayer SpatRaster object. suitable small medium sized rasters, entire image embedded HTML page (passed websocket Shiny context).","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addRasterImage.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a raster image as a layer — addRasterImage","text":"","code":"addRasterImage( map, x, colors = if (is.factor(x)[1]) \"Set1\" else \"Spectral\", opacity = 1, attribution = NULL, layerId = NULL, group = NULL, project = TRUE, method = c(\"auto\", \"bilinear\", \"ngb\"), maxBytes = 4 * 1024 * 1024, options = gridOptions(), data = getMapData(map) ) projectRasterForLeaflet(x, method)"},{"path":"https://rstudio.github.io/leaflet/reference/addRasterImage.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a raster image as a layer — addRasterImage","text":"map map widget object x terra::SpatRaster() RasterLayer object–see raster::raster() colors color palette (see colorNumeric()) function use color raster values (hint: providing function, set na.color \"#00000000\" make NA areas transparent). palette ignored x SpatRaster color table RGB channels. opacity base opacity raster, expressed 0 1 attribution HTML string show attribution layer layerId layer id group name group raster image belong (see parameter addTiles()) project TRUE, automatically project x map projection expected Leaflet (EPSG:3857); FALSE, caller's responsibility ensure x already projected, extent(x) expressed WGS84 latitude/longitude coordinates method method used computing values new, projected raster image. \"bilinear\" (default) appropriate continuous data, \"ngb\" - nearest neighbor - appropriate categorical data. Ignored project = FALSE. See projectRaster() details. maxBytes maximum number bytes allow projected image (base64 encoding); defaults 4MB. options list additional options, intended provided call gridOptions() data data object argument values derived; default, data object provided leaflet() initially, can overridden","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addRasterImage.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Add a raster image as a layer — addRasterImage","text":"maxBytes parameter serves prevent accidentally embedding excessively large amount data htmlwidget. value compared size final compressed image (raster projected, colored, PNG encoded, base64 encoding applied). Set maxBytes Inf disable check, aware large rasters may make map large download also may cause browser become slow unresponsive. reduce size SpatRaster, can use terra::spatSample() x = spatSample(x, 100000, method=\"regular\", .raster=TRUE). RasterLayer can use raster::sampleRegular() sampleRegular(x, 100000, asRaster=TRUE). default, addRasterImage() project raster data x Pseudo-Mercator projection (EPSG:3857). can time-consuming operation even moderately sized rasters; although much faster SpatRasters RasterLayers. repeatedly adding particular raster Leaflet maps, can perform projection ahead time using projectRasterForLeaflet(), call addRasterImage() project = FALSE.","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/addRasterImage.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a raster image as a layer — addRasterImage","text":"","code":"library(raster) #> Loading required package: sp r <- raster(xmn = -2.8, xmx = -2.79, ymn = 54.04, ymx = 54.05, nrows = 30, ncols = 30) values(r) <- matrix(1:900, nrow(r), ncol(r), byrow = TRUE) crs(r) <- CRS(\"+init=epsg:4326\") #> Warning: GDAL Message 1: +init=epsg:XXXX syntax is deprecated. It might return a CRS with a non-EPSG compliant axis order. pal <- colorNumeric(\"Spectral\", domain = c(0, 1000)) leaflet() %>% addTiles() %>% addRasterImage(r, colors = pal, opacity = 0.8) %>% addLegend(pal = pal, values = c(0, 1000)) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addRasterImage\",\"args\":[\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAB4AAAAeCAYAAAA7MK6iAAACJUlEQVRIiZ1V227bMAw9bNh1Ltrau7zsd/qj/cBtCQpkgAMs5R6sC0VStrOXyiLPTbSc0tvdq4AAIgBEaUVnXfpEABD0oPapXzDLn4Lh6QcrkYXshBGTyWGo6TUYUKPL08StUQJEAta85cUG6VHVlgf+MnLHJE6PxkRcfRsni/HTKAHBC5IV3mUaaadRDy9XBwqNUr/UDQaQIFx+FqfLw8vfyrXiZgrx6TynXoL63vM+P/PDlJPY70Cb6NtMrl4M1b2oWj4MQODD9yEQtESqp+oJBqF6U1iMvw1hg3ohgrHZAD6g5/Pd10ElNemDtXlnO/DxNwkwTc83EW416OEZ41NAWCNGuNuDMcbndWJkYvs9fKpTUGd6HPuCPbG1EDvDMR5H09gQ+x9TxycwhulG0h6cQNKal1zJBb7ef6qATJFMyvAPI5j6H2gNbL/RawPx5Xp2FIhJ3PRVRzYMnV7t85yMGwHZMCwjjAx14KznA/F8/ZM1AFCl1NdTeOn/k9rD4Ft+gwdBpO75dOEiUoxEE6IQ1OBdCFAnWK3xaWZjqge3hFg3qUG2pqX7fLwcDKCOLBaIQ7r+BpZ/z9QHdIS9ODkjjXVcAfjXbC/EPuPVXmBke/xz3icchQpPn2+z1DryZS1gAh/PB/WZUQLWS7NGLkaJC22e8FpL/d6Az6fPhqACdEylCVRPWCdlD+Ax/H58aMesiNrIYaTe/HKivC+4GlCUjgjwD8Ffj6cl3305AAAAAElFTkSuQmCC\",[[54.04999999999998,-2.799999999999999],[54.03999999999998,-2.79]],null,null,{\"tileSize\":256,\"zIndex\":1,\"minZoom\":0,\"opacity\":0.8}]},{\"method\":\"addLegend\",\"args\":[{\"colors\":[\"#9E0142 , #9E0142 0%, #F46D43 20%, #FEE08B 40%, #E6F598 60%, #66C2A5 80%, #5E4FA2 100%, #5E4FA2 \"],\"labels\":[\"0\",\"200\",\"400\",\"600\",\"800\",\"1,000\"],\"na_color\":null,\"na_label\":\"NA\",\"opacity\":0.5,\"position\":\"topright\",\"type\":\"numeric\",\"title\":null,\"extra\":{\"p_1\":0,\"p_n\":1},\"layerId\":null,\"className\":\"info legend\",\"group\":null}]}],\"limits\":{\"lat\":[54.03999999999998,54.04999999999998],\"lng\":[-2.799999999999999,-2.79]}},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addRasterLegend.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a color legend for a SpatRaster to a map — addRasterLegend","title":"Add a color legend for a SpatRaster to a map — addRasterLegend","text":"function adding legend specifically designed terra::SpatRaster objects, categorical values, carry color table.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addRasterLegend.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a color legend for a SpatRaster to a map — addRasterLegend","text":"","code":"addRasterLegend(map, x, layer = 1, ...)"},{"path":"https://rstudio.github.io/leaflet/reference/addRasterLegend.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a color legend for a SpatRaster to a map — addRasterLegend","text":"map map widget object x SpatRaster object color table layer layer raster target ... additional arguments pass addLegend()","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/addRasterLegend.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a color legend for a SpatRaster to a map — addRasterLegend","text":"","code":"if (FALSE) { # interactive() library(terra) r <- rast(\"/vsicurl/https://geodata.ucdavis.edu/test/pr_nlcd.tif\") leaflet() %>% addTiles() %>% addRasterImage(r, opacity = 0.75) %>% addRasterLegend(r, opacity = 0.75) plot.new() # pause in interactive mode rr <- r levels(rr) <- NULL leaflet() %>% addTiles() %>% addRasterImage(rr, opacity = 0.75) %>% addRasterLegend(rr, opacity = 0.75) }"},{"path":"https://rstudio.github.io/leaflet/reference/addScaleBar.html","id":null,"dir":"Reference","previous_headings":"","what":"Add or remove a scale bar — addScaleBar","title":"Add or remove a scale bar — addScaleBar","text":"Uses Leaflet's built-scale bar feature add scale bar.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addScaleBar.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add or remove a scale bar — addScaleBar","text":"","code":"addScaleBar( map, position = c(\"topright\", \"bottomright\", \"bottomleft\", \"topleft\"), options = scaleBarOptions() ) scaleBarOptions( maxWidth = 100, metric = TRUE, imperial = TRUE, updateWhenIdle = TRUE ) removeScaleBar(map)"},{"path":"https://rstudio.github.io/leaflet/reference/addScaleBar.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add or remove a scale bar — addScaleBar","text":"map map add scale bar position position control: \"topleft\", \"topright\", \"bottomleft\", \"bottomright\". options list additional options, intended provided call scaleBarOptions() maxWidth maximum width control pixels (default 100) metric TRUE (default), show scale bar metric units (m/km) imperial TRUE (default), show scale bar imperial units (ft/mi) updateWhenIdle FALSE (default), scale bar always --date (updated move). TRUE, control updated moveend.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addScaleBar.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add or remove a scale bar — addScaleBar","text":"","code":"# \\donttest{ leaflet() %>% addTiles() %>% addScaleBar() {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addScaleBar\",\"args\":[{\"maxWidth\":100,\"metric\":true,\"imperial\":true,\"updateWhenIdle\":true,\"position\":\"topright\"}]}]},\"evals\":[],\"jsHooks\":[]}# }"},{"path":"https://rstudio.github.io/leaflet/reference/addSimpleGraticule.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a simple Graticule on the map — addSimpleGraticule","title":"Add a simple Graticule on the map — addSimpleGraticule","text":"Add simple Graticule map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addSimpleGraticule.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a simple Graticule on the map — addSimpleGraticule","text":"","code":"addSimpleGraticule( map, interval = 20, showOriginLabel = TRUE, redraw = \"move\", hidden = FALSE, zoomIntervals = list(), layerId = NULL, group = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/addSimpleGraticule.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a simple Graticule on the map — addSimpleGraticule","text":"map map widget object interval spacing map units horizontal vertical lines. showOriginLabel true Whether show '(0,0)' origin. redraw map event redraw graticule. move default \"moveend\" can smoother. hidden hide start zoomIntervals use different intervals different zoom levels. specified, zoom levels use value interval option. layerId layer id group name group layer belongs .","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/addSimpleGraticule.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a simple Graticule on the map — addSimpleGraticule","text":"","code":"leaflet() %>% addTiles() %>% addSimpleGraticule() {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addSimpleGraticule\",\"args\":[20,true,\"move\",false,[],null,null]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addTerminator.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a daylight layer on top of the map — addTerminator","title":"Add a daylight layer on top of the map — addTerminator","text":"See https://github.com/joergdietrich/Leaflet.Terminator","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addTerminator.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a daylight layer on top of the map — addTerminator","text":"","code":"addTerminator( map, resolution = 2, time = NULL, layerId = NULL, group = NULL, options = pathOptions(pointerEvents = \"none\", clickable = FALSE) )"},{"path":"https://rstudio.github.io/leaflet/reference/addTerminator.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a daylight layer on top of the map — addTerminator","text":"map map widget object resolution step size terminator points computed. step size 1 degree/resolution, .e., higher resolution values smaller step sizes points polygon. default value 2. time Time layerId layer id group name group layer belongs . options path options daynight layer","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addTerminator.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a daylight layer on top of the map — addTerminator","text":"","code":"leaf <- leaflet() %>% addTiles() %>% addTerminator() leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addTerminator\",\"args\":[2,null,null,null,{\"interactive\":false,\"pointerEvents\":\"none\",\"className\":\"\"}]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/atlStorms2005.html","id":null,"dir":"Reference","previous_headings":"","what":"Atlantic Ocean storms 2005 — atlStorms2005","title":"Atlantic Ocean storms 2005 — atlStorms2005","text":"Atlantic Ocean storms 2005","code":""},{"path":"https://rstudio.github.io/leaflet/reference/atlStorms2005.html","id":"format","dir":"Reference","previous_headings":"","what":"Format","title":"Atlantic Ocean storms 2005 — atlStorms2005","text":"sp::SpatialLinesDataFrame","code":""},{"path":"https://rstudio.github.io/leaflet/reference/atlStorms2005.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Atlantic Ocean storms 2005 — atlStorms2005","text":"dataset contains storm tracks selected storms Atlantic Ocean basin year 2005","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIconList.html","id":null,"dir":"Reference","previous_headings":"","what":"Make awesome-icon set — awesomeIconList","title":"Make awesome-icon set — awesomeIconList","text":"Make awesome-icon set","code":""},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIconList.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Make awesome-icon set — awesomeIconList","text":"","code":"awesomeIconList(...)"},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIconList.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Make awesome-icon set — awesomeIconList","text":"... icons created makeAwesomeIcon()","code":""},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIconList.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Make awesome-icon set — awesomeIconList","text":"","code":"iconSet <- awesomeIconList( home = makeAwesomeIcon(icon = \"Home\", library = \"fa\"), flag = makeAwesomeIcon(icon = \"Flag\", library = \"fa\") ) iconSet[c(\"home\", \"flag\")] #> $home #> $icon #> [1] \"Home\" #> #> $library #> [1] \"fa\" #> #> $markerColor #> [1] \"blue\" #> #> $iconColor #> [1] \"white\" #> #> $spin #> [1] FALSE #> #> $squareMarker #> [1] FALSE #> #> $iconRotate #> [1] 0 #> #> $font #> [1] \"monospace\" #> #> attr(,\"class\") #> [1] \"leaflet_awesome_icon\" #> #> $flag #> $icon #> [1] \"Flag\" #> #> $library #> [1] \"fa\" #> #> $markerColor #> [1] \"blue\" #> #> $iconColor #> [1] \"white\" #> #> $spin #> [1] FALSE #> #> $squareMarker #> [1] FALSE #> #> $iconRotate #> [1] 0 #> #> $font #> [1] \"monospace\" #> #> attr(,\"class\") #> [1] \"leaflet_awesome_icon\" #> #> attr(,\"class\") #> [1] \"leaflet_awesome_icon_set\""},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIcons.html","id":null,"dir":"Reference","previous_headings":"","what":"Create a list of awesome icon data — awesomeIcons","title":"Create a list of awesome icon data — awesomeIcons","text":"icon can represented list form list(icon, library, ...). function vectorized arguments create list icon data. Shorter argument values recycled. NULL values arguments ignored.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIcons.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Create a list of awesome icon data — awesomeIcons","text":"","code":"awesomeIcons( icon = \"home\", library = \"glyphicon\", markerColor = \"blue\", iconColor = \"white\", spin = FALSE, extraClasses = NULL, squareMarker = FALSE, iconRotate = 0, fontFamily = \"monospace\", text = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIcons.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Create a list of awesome icon data — awesomeIcons","text":"icon Name icon library icon library. Default \"glyphicon\", possible values \"fa\" (fontawesome) \"ion\" (ionicons). markerColor Possible values \"red\", \"darkred\", \"lightred\", \"orange\", \"beige\", \"green\", \"darkgreen\", \"lightgreen\", \"blue\", \"darkblue\", \"lightblue\", \"purple\", \"darkpurple\", \"pink\", \"cadetblue\", \"white\", \"gray\", \"lightgray\", \"black\" iconColor color use icon . Use CSS-valid color (hex, rgba, etc.) named web color. spin TRUE, make icon spin (works library = \"fa\") extraClasses Additional css classes include icon. squareMarker Whether use square marker. iconRotate Rotate icon given angle. fontFamily Used text option specified. text Use text string instead icon. Argument addAwesomeMarkers().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIcons.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Create a list of awesome icon data — awesomeIcons","text":"list awesome-icon data can passed icon","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/breweries91.html","id":null,"dir":"Reference","previous_headings":"","what":"Selected breweries in Franconia — breweries91","title":"Selected breweries in Franconia — breweries91","text":"Selected breweries Franconia (zip code starting 91...)","code":""},{"path":"https://rstudio.github.io/leaflet/reference/breweries91.html","id":"format","dir":"Reference","previous_headings":"","what":"Format","title":"Selected breweries in Franconia — breweries91","text":"sp::SpatialPointsDataFrame","code":""},{"path":"https://rstudio.github.io/leaflet/reference/breweries91.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Selected breweries in Franconia — breweries91","text":"dataset contains selected breweries Franconia. subset larger database compiled students University Marburg seminar called \"Geography Beer, sustainability food industry\"","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":null,"dir":"Reference","previous_headings":"","what":"Color mapping — colorNumeric","title":"Color mapping — colorNumeric","text":"Conveniently maps data values (numeric factor/character) colors according given palette, can provided variety formats.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Color mapping — colorNumeric","text":"","code":"colorNumeric( palette, domain, na.color = \"#808080\", alpha = FALSE, reverse = FALSE ) colorBin( palette, domain, bins = 7, pretty = TRUE, na.color = \"#808080\", alpha = FALSE, reverse = FALSE, right = FALSE ) colorQuantile( palette, domain, n = 4, probs = seq(0, 1, length.out = n + 1), na.color = \"#808080\", alpha = FALSE, reverse = FALSE, right = FALSE ) colorFactor( palette, domain, levels = NULL, ordered = FALSE, na.color = \"#808080\", alpha = FALSE, reverse = FALSE )"},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Color mapping — colorNumeric","text":"palette colors color function values mapped domain possible values can mapped. colorNumeric() colorBin(), can simple numeric range (e.g., c(0, 100)); colorQuantile() needs representative numeric data; colorFactor() needs categorical data. NULL, whenever resulting color function called, x value represent domain. implies function invoked multiple times, encoding values colors may consistent; consistency needed, must provide non-NULL domain. na.color color return NA values. Note na.color = NA valid. alpha Whether alpha channels respected ignored. TRUE colors without explicit alpha information treated fully opaque. reverse Whether colors (color function) palette used reverse order. example, default order palette goes blue green, reverse = TRUE result colors going green blue. bins Either numeric vector two unique cut points single number (greater equal 2) giving number intervals domain values cut. pretty Whether use function pretty() generate bins argument bins single number. pretty = TRUE, actual number bins may number bins specified. pretty = FALSE, seq() used generate bins breaks may \"pretty\". right parameter supplied cut. See Details n Number equal-size quantiles desired. precise control, use probs instead. probs See stats::quantile(). provided, n ignored. levels alternate way specifying levels; specified, domain ignored ordered TRUE domain needs coerced factor, treat already correct order","code":""},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Color mapping — colorNumeric","text":"function takes single parameter x; called vector numbers (except colorFactor(), expects factors/characters), #RRGGBB color strings returned (unless alpha = TRUE case #RRGGBBAA may also possible).","code":""},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Color mapping — colorNumeric","text":"colorNumeric() simple linear mapping continuous numeric data interpolated palette. colorBin() also maps continuous numeric data, performs binning based value (see base::cut() function). colorBin() defaults base::cut() function include.lowest = TRUE right = FALSE. colorQuantile() similarly bins numeric data, via stats::quantile(). colorFactor() maps factors colors. palette discrete different number colors number factors, interpolation used. palette argument can following: character vector RGB named colors. Examples: palette(), c(\"#000000\", \"#0000FF\", \"#FFFFFF\"), topo.colors(10) name RColorBrewer palette, e.g., \"BuPu\" \"Greens\". full name viridis palette: \"magma\", \"inferno\", \"plasma\", \"viridis\", \"cividis\", \"rocket\", \"mako\", \"turbo\" function receives single value 0 1 returns color. Examples: colorRamp(c(\"#000000\", \"#FFFFFF\"), interpolate = \"spline\").","code":""},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Color mapping — colorNumeric","text":"","code":"pal <- colorBin(\"Greens\", domain = 0:100) pal(runif(10, 60, 100)) #> [1] \"#31A354\" \"#31A354\" \"#31A354\" \"#31A354\" \"#31A354\" \"#31A354\" \"#006D2C\" #> [8] \"#31A354\" \"#006D2C\" \"#006D2C\" if (interactive()) { # Exponential distribution, mapped continuously previewColors(colorNumeric(\"Blues\", domain = NULL), sort(rexp(16))) # Exponential distribution, mapped by interval previewColors(colorBin(\"Blues\", domain = NULL, bins = 4), sort(rexp(16))) # Exponential distribution, mapped by quantile previewColors(colorQuantile(\"Blues\", domain = NULL), sort(rexp(16))) # Categorical data; by default, the values being colored span the gamut... previewColors(colorFactor(\"RdYlBu\", domain = NULL), LETTERS[1:5]) # ...unless the data is a factor, without droplevels... previewColors(colorFactor(\"RdYlBu\", domain = NULL), factor(LETTERS[1:5], levels = LETTERS)) # ...or the domain is stated explicitly. previewColors(colorFactor(\"RdYlBu\", levels = LETTERS), LETTERS[1:5]) }"},{"path":"https://rstudio.github.io/leaflet/reference/deprecated.html","id":null,"dir":"Reference","previous_headings":"","what":"Legacy functions — createLeafletMap","title":"Legacy functions — createLeafletMap","text":"functions provided backwards compatibility first iteration leaflet bindings (https://github.com/jcheng5/leaflet-shiny).","code":""},{"path":"https://rstudio.github.io/leaflet/reference/deprecated.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Legacy functions — createLeafletMap","text":"","code":"createLeafletMap(session, outputId) leafletMap( outputId, width, height, initialTileLayer = \"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\", initialTileLayerAttribution = NULL, options = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/deprecated.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Legacy functions — createLeafletMap","text":"session, outputId Deprecated width, height, initialTileLayer, initialTileLayerAttribution, options Deprecated","code":""},{"path":"https://rstudio.github.io/leaflet/reference/derivePoints.html","id":null,"dir":"Reference","previous_headings":"","what":"Normalize data to a data frame or Spatial object. — derivePoints","title":"Normalize data to a data frame or Spatial object. — derivePoints","text":"Given data object lng/lat arguments (may NULL) [meaning infer data], formula [evaluated respect data], vector data [used -]) return lng/lat data frame.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/derivePoints.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Normalize data to a data frame or Spatial object. — derivePoints","text":"","code":"derivePoints( data, lng = NULL, lat = NULL, missingLng = missing(lng), missingLat = missing(lat), funcName = \"f\" ) derivePolygons( data, lng = NULL, lat = NULL, missingLng = missing(lng), missingLat = missing(lat), funcName = \"f\" )"},{"path":"https://rstudio.github.io/leaflet/reference/derivePoints.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Normalize data to a data frame or Spatial object. — derivePoints","text":"data map data lng, lat longitude latitude missingLng whether lng missing missingLat whether lat missing funcName Name calling function (logging)","code":""},{"path":"https://rstudio.github.io/leaflet/reference/derivePoints.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Normalize data to a data frame or Spatial object. — derivePoints","text":"derivePoints() returns lng/lat data frame. derivePolygons() returns list bbox attributes.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/dispatch.html","id":null,"dir":"Reference","previous_headings":"","what":"Extension points for plugins — dispatch","title":"Extension points for plugins — dispatch","text":"Extension points plugins","code":""},{"path":"https://rstudio.github.io/leaflet/reference/dispatch.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Extension points for plugins — dispatch","text":"","code":"dispatch( map, funcName, leaflet = stop(paste(funcName, \"requires a map proxy object\")), leaflet_proxy = stop(paste(funcName, \"does not support map proxy objects\")) ) invokeMethod(map, data, method, ...)"},{"path":"https://rstudio.github.io/leaflet/reference/dispatch.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Extension points for plugins — dispatch","text":"map map object, returned leaflet() leafletProxy() funcName name function user called caused dispatch call; error message purposes leaflet action performed map leaflet() leaflet_proxy action performed map leafletProxy(). data data object used evaluating formulas ... method name JavaScript method invoke ... unnamed arguments passed JavaScript method","code":""},{"path":"https://rstudio.github.io/leaflet/reference/dispatch.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Extension points for plugins — dispatch","text":"dispatch() returns value leaflet leaflet_proxy(), error. invokeMethod() returns map object passed , possibly modified.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/easyButton.html","id":null,"dir":"Reference","previous_headings":"","what":"Create an easyButton statestate — easyButtonState","title":"Create an easyButton statestate — easyButtonState","text":"Create easyButton statestate Creates easy button. Add EasyButton map see https://github.com/CliffCloud/Leaflet.EasyButton Add easyButton bar map see https://github.com/CliffCloud/Leaflet.EasyButton","code":""},{"path":"https://rstudio.github.io/leaflet/reference/easyButton.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Create an easyButton statestate — easyButtonState","text":"","code":"easyButtonState(stateName, icon, title, onClick) easyButton( icon = NULL, title = NULL, onClick = NULL, position = \"topleft\", id = NULL, states = NULL ) addEasyButton(map, button) addEasyButtonBar(map, ..., position = \"topleft\", id = NULL)"},{"path":"https://rstudio.github.io/leaflet/reference/easyButton.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Create an easyButton statestate — easyButtonState","text":"stateName unique name state icon button icon title text show hover onClick action take position topleft|topright|bottomleft|bottomright id id button states states map map widget object button button object created easyButton() ... list buttons created easyButton()","code":""},{"path":"https://rstudio.github.io/leaflet/reference/easyButton.html","id":"functions","dir":"Reference","previous_headings":"","what":"Functions","title":"Create an easyButton statestate — easyButtonState","text":"easyButtonState(): state easyButton. addEasyButton(): add EasyButton map addEasyButtonBar(): add EasyButton map","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/easyButton.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Create an easyButton statestate — easyButtonState","text":"","code":"leaf <- leaflet() %>% addTiles() %>% addEasyButton(easyButton( icon = htmltools::span(class = \"star\", htmltools::HTML(\"★\")), onClick = JS(\"function(btn, map){ map.setZoom(1);}\"))) leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addEasyButton\",\"args\":[{\"icon\":\"★<\\/span>\",\"title\":[],\"onClick\":\"function(btn, map){ map.setZoom(1);}\",\"position\":\"topleft\"}]}]},\"evals\":[\"calls.1.args.0.onClick\"],\"jsHooks\":[]} leaf <- leaflet() %>% addTiles() %>% addEasyButtonBar( easyButton( icon = htmltools::span(class = \"star\", htmltools::HTML(\"★\")), onClick = JS(\"function(btn, map){ alert(\\\"Button 1\\\");}\")), easyButton( icon = htmltools::span(class = \"star\", htmltools::HTML(\"⌖\")), onClick = JS(\"function(btn, map){ alert(\\\"Button 2\\\");}\"))) leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addEasyButtonBar\",\"args\":[[{\"icon\":\"★<\\/span>\",\"title\":[],\"onClick\":\"function(btn, map){ alert(\\\"Button 1\\\");}\",\"position\":\"topleft\"},{\"icon\":\"⌖<\\/span>\",\"title\":[],\"onClick\":\"function(btn, map){ alert(\\\"Button 2\\\");}\",\"position\":\"topleft\"}],\"topleft\",null]}]},\"evals\":[\"calls.1.args.0.0.onClick\",\"calls.1.args.0.1.onClick\"],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/evalFormula.html","id":null,"dir":"Reference","previous_headings":"","what":"Evaluate list members that are formulae, using the map data as the environment — evalFormula","title":"Evaluate list members that are formulae, using the map data as the environment — evalFormula","text":"Evaluates provided. Otherwise, formula environment evaluated.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/evalFormula.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Evaluate list members that are formulae, using the map data as the environment — evalFormula","text":"","code":"evalFormula(list, data)"},{"path":"https://rstudio.github.io/leaflet/reference/evalFormula.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Evaluate list members that are formulae, using the map data as the environment — evalFormula","text":"list members formulae data map data","code":""},{"path":"https://rstudio.github.io/leaflet/reference/expandLimits.html","id":null,"dir":"Reference","previous_headings":"","what":"Notifies the map of new latitude/longitude of items of interest on the map — expandLimits","title":"Notifies the map of new latitude/longitude of items of interest on the map — expandLimits","text":"Notifies map new latitude/longitude items interest map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/expandLimits.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Notifies the map of new latitude/longitude of items of interest on the map — expandLimits","text":"","code":"expandLimits(map, lat, lng)"},{"path":"https://rstudio.github.io/leaflet/reference/expandLimits.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Notifies the map of new latitude/longitude of items of interest on the map — expandLimits","text":"map map object lat vector latitudes lng vector longitudes","code":""},{"path":"https://rstudio.github.io/leaflet/reference/expandLimitsBbox.html","id":null,"dir":"Reference","previous_headings":"","what":"Notifies the map of polygons of interest on the map — expandLimitsBbox","title":"Notifies the map of polygons of interest on the map — expandLimitsBbox","text":"expandLimits(), takes polygon (presumably bbox attr) rather lat/lng.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/expandLimitsBbox.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Notifies the map of polygons of interest on the map — expandLimitsBbox","text":"","code":"expandLimitsBbox(map, poly)"},{"path":"https://rstudio.github.io/leaflet/reference/expandLimitsBbox.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Notifies the map of polygons of interest on the map — expandLimitsBbox","text":"map map object poly spatial object representing polygon.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/filterNULL.html","id":null,"dir":"Reference","previous_headings":"","what":"Remove NULL elements from a list — filterNULL","title":"Remove NULL elements from a list — filterNULL","text":"Remove NULL elements list","code":""},{"path":"https://rstudio.github.io/leaflet/reference/filterNULL.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Remove NULL elements from a list — filterNULL","text":"","code":"filterNULL(x)"},{"path":"https://rstudio.github.io/leaflet/reference/filterNULL.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Remove NULL elements from a list — filterNULL","text":"x list.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/filterNULL.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Remove NULL elements from a list — filterNULL","text":"list NULL elements filtered .","code":""},{"path":"https://rstudio.github.io/leaflet/reference/gadmCHE.html","id":null,"dir":"Reference","previous_headings":"","what":"Administrative borders of Switzerland (level 1) — gadmCHE","title":"Administrative borders of Switzerland (level 1) — gadmCHE","text":"Administrative borders Switzerland (level 1)","code":""},{"path":"https://rstudio.github.io/leaflet/reference/gadmCHE.html","id":"format","dir":"Reference","previous_headings":"","what":"Format","title":"Administrative borders of Switzerland (level 1) — gadmCHE","text":"sp::SpatialPolygonsDataFrame","code":""},{"path":"https://rstudio.github.io/leaflet/reference/gadmCHE.html","id":"source","dir":"Reference","previous_headings":"","what":"Source","title":"Administrative borders of Switzerland (level 1) — gadmCHE","text":"https://gadm.org","code":""},{"path":"https://rstudio.github.io/leaflet/reference/gadmCHE.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Administrative borders of Switzerland (level 1) — gadmCHE","text":"dataset comes https://gadm.org. downloaded using getData().","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/getMapData.html","id":null,"dir":"Reference","previous_headings":"","what":"Extract the map's data — getMapData","title":"Extract the map's data — getMapData","text":"Extract map's data","code":""},{"path":"https://rstudio.github.io/leaflet/reference/getMapData.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Extract the map's data — getMapData","text":"","code":"getMapData(map)"},{"path":"https://rstudio.github.io/leaflet/reference/getMapData.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Extract the map's data — getMapData","text":"map map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/getMapData.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Extract the map's data — getMapData","text":"map's data","code":""},{"path":"https://rstudio.github.io/leaflet/reference/groupOptions.html","id":null,"dir":"Reference","previous_headings":"","what":"Set options on layer groups — groupOptions","title":"Set options on layer groups — groupOptions","text":"Change options layer groups. Currently option control zoom levels layer group displayed . zoomLevels option compatible layers control; assign group zoom levels use addLayersControl().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/groupOptions.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Set options on layer groups — groupOptions","text":"","code":"groupOptions(map, group, zoomLevels = NULL)"},{"path":"https://rstudio.github.io/leaflet/reference/groupOptions.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Set options on layer groups — groupOptions","text":"map map modify group character vector one group names set options zoomLevels numeric vector zoom levels group(s) visible, TRUE display zoom levels","code":""},{"path":"https://rstudio.github.io/leaflet/reference/groupOptions.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Set options on layer groups — groupOptions","text":"","code":"pal <- colorQuantile(\"YlOrRd\", quakes$mag) leaflet() %>% # Basic markers addTiles(group = \"basic\") %>% addMarkers(data = quakes, group = \"basic\") %>% # When zoomed in, we'll show circles at the base of each marker whose # radius and color reflect the magnitude addProviderTiles(providers$Esri.WorldTopoMap, group = \"detail\") %>% addCircleMarkers(data = quakes, group = \"detail\", fillOpacity = 0.5, radius = ~mag * 5, color = ~pal(mag), stroke = FALSE) %>% # Set the detail group to only appear when zoomed in groupOptions(\"detail\", zoomLevels = 7:18) #> Assuming \"long\" and \"lat\" are longitude and latitude, respectively #> Assuming \"long\" and \"lat\" are longitude and latitude, respectively {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,\"basic\",{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMarkers\",\"args\":[[-20.42,-20.62,-26,-17.97,-20.42,-19.68,-11.7,-28.11,-28.74,-17.47,-21.44,-12.26,-18.54,-21,-20.7,-15.94,-13.64,-17.83,-23.5,-22.63,-20.84,-10.98,-23.3,-30.2,-19.66,-17.94,-14.72,-16.46,-20.97,-19.84,-22.58,-16.32,-15.55,-23.55,-16.3,-25.82,-18.73,-17.64,-17.66,-18.82,-37.37,-15.31,-24.97,-15.49,-19.23,-30.1,-26.4,-11.77,-24.12,-18.97,-18.75,-19.26,-22.75,-21.37,-20.1,-19.85,-22.7,-22.06,-17.8,-24.2,-20.69,-21.16,-13.82,-11.49,-20.68,-17.1,-20.14,-21.96,-20.42,-15.46,-15.31,-19.86,-11.55,-23.74,-17.7,-23.54,-19.21,-12.11,-21.81,-28.98,-34.02,-23.84,-19.57,-20.12,-17.7,-19.66,-21.5,-23.64,-15.43,-15.41,-15.48,-13.36,-20.64,-19.72,-15.44,-19.73,-27.24,-18.16,-13.66,-24.57,-16.98,-26.2,-21.88,-33,-21.33,-19.44,-34.89,-20.24,-22.55,-36.95,-15.75,-16.85,-19.06,-26.11,-26.2,-26.13,-13.66,-13.47,-14.6,-18.96,-14.65,-19.9,-22.05,-19.22,-31.24,-17.93,-19.3,-26.53,-27.72,-19.19,-17.43,-17.05,-19.52,-23.71,-21.3,-16.24,-16.14,-23.95,-25.2,-18.84,-12.66,-20.65,-13.23,-29.91,-14.31,-20.1,-17.8,-21.27,-23.58,-17.9,-23.34,-15.56,-23.83,-11.8,-15.54,-20.65,-11.75,-24.81,-20.9,-11.34,-17.98,-24.34,-13.86,-35.56,-35.48,-34.2,-26,-19.89,-23.43,-18.89,-17.82,-25.68,-20.2,-15.2,-15.03,-32.22,-22.64,-17.42,-17.84,-15.02,-18.04,-24.6,-19.88,-20.3,-20.45,-17.67,-22.3,-19.85,-24.27,-15.85,-20.02,-18.56,-17.87,-24.08,-32.2,-20.36,-23.85,-24,-20.41,-17.72,-19.67,-17.7,-16.23,-26.72,-12.95,-21.97,-21.96,-20.32,-30.28,-20.2,-30.66,-16.17,-28.25,-20.47,-23.55,-20.94,-26.67,-18.13,-20.21,-18.31,-16.52,-22.36,-22.43,-20.37,-23.77,-13.65,-21.55,-16.24,-23.73,-22.34,-19.4,-24.64,-16,-19.62,-23.84,-23.54,-28.23,-21.68,-13.44,-24.96,-20.08,-24.36,-14.7,-18.2,-16.65,-18.11,-17.95,-15.5,-23.36,-19.15,-10.97,-14.85,-17.8,-22.5,-29.1,-20.32,-16.09,-19.18,-23.81,-23.79,-19.02,-20.9,-19.06,-17.88,-19.41,-26.17,-14.95,-18.73,-20.21,-21.29,-19.76,-22.09,-23.8,-20.16,-22.13,-17.44,-23.33,-24.78,-22,-19.13,-30.72,-22.32,-16.45,-17.7,-17.95,-24.4,-19.3,-21.13,-18.07,-20.6,-18.48,-13.34,-20.92,-25.31,-15.24,-16.4,-24.57,-17.94,-30.64,-18.64,-13.09,-19.68,-16.44,-21.09,-14.99,-23.3,-17.68,-22,-21.38,-32.62,-13.05,-12.93,-18.6,-21.34,-21.48,-17.4,-17.32,-18.77,-26.16,-12.59,-14.82,-21.79,-19.83,-29.5,-12.49,-26.1,-21.04,-10.78,-20.76,-11.41,-19.1,-23.91,-27.33,-12.25,-23.49,-27.18,-25.8,-27.19,-27.27,-27.1,-27.22,-27.38,-27.27,-27.54,-27.2,-27.71,-27.6,-27.38,-21.54,-27.21,-28.96,-12.01,-17.46,-30.17,-27.27,-17.79,-22.19,-17.1,-27.18,-11.64,-17.98,-16.9,-21.98,-32.14,-18.8,-26.78,-20.43,-18.3,-15.83,-23.44,-23.73,-19.89,-17.59,-19.77,-20.31,-15.33,-18.2,-15.36,-15.29,-15.36,-16.24,-13.47,-25.5,-14.32,-20.04,-28.83,-17.82,-27.23,-10.72,-27,-20.36,-27.17,-20.94,-17.46,-21.04,-23.7,-17.72,-15.87,-17.84,-13.45,-30.8,-11.63,-30.4,-26.18,-15.7,-17.95,-20.51,-15.36,-23.61,-33.2,-17.68,-22.24,-20.07,-25.04,-21.5,-14.28,-14.43,-32.7,-34.1,-19.7,-24.19,-26.6,-17.04,-22.1,-32.6,-33,-20.58,-20.61,-19.47,-17.47,-18.4,-23.33,-18.55,-26.16,-21.8,-27.63,-18.89,-20.3,-20.56,-16.1,-12.66,-21.05,-17.97,-19.83,-22.55,-22.28,-15.72,-20.85,-21.11,-25.31,-26.46,-24.09,-16.96,-23.19,-20.81,-15.03,-18.06,-19,-23.53,-18.18,-15.66,-18,-18.08,-18.05,-29.9,-20.9,-15.61,-16.03,-17.68,-31.94,-19.14,-18,-16.95,-10.79,-20.83,-32.9,-37.93,-29.09,-23.56,-19.6,-21.39,-14.85,-22.7,-32.42,-17.9,-23.58,-34.4,-17.61,-21.07,-13.84,-30.24,-18.49,-23.45,-16.04,-17.14,-22.54,-15.9,-30.04,-24.03,-18.89,-16.51,-20.1,-21.06,-13.07,-23.46,-19.41,-11.81,-11.76,-12.08,-25.59,-26.54,-20.9,-16.99,-23.46,-17.81,-15.17,-11.67,-20.75,-19.5,-26.18,-20.66,-19.22,-24.68,-15.43,-32.45,-21.31,-15.44,-13.26,-15.26,-33.57,-15.77,-15.79,-21,-16.28,-23.28,-16.1,-17.7,-15.96,-15.95,-17.56,-15.9,-15.29,-15.86,-16.2,-15.71,-16.45,-11.54,-19.61,-15.61,-21.16,-20.65,-20.33,-15.08,-23.28,-23.44,-23.12,-23.65,-22.91,-22.06,-13.56,-17.99,-23.92,-30.69,-21.92,-25.04,-19.92,-27.75,-17.71,-19.6,-34.68,-14.46,-18.85,-17.02,-20.41,-18.18,-16.49,-17.74,-20.49,-18.51,-27.28,-15.9,-20.57,-11.25,-20.04,-20.89,-16.62,-20.09,-24.96,-20.95,-23.31,-20.95,-21.58,-13.62,-12.72,-21.79,-20.48,-12.84,-17.02,-23.89,-23.07,-27.98,-28.1,-21.24,-21.24,-19.89,-32.82,-22,-21.57,-24.5,-33.03,-30.09,-22.75,-17.99,-19.6,-15.65,-17.78,-22.04,-20.06,-18.07,-12.85,-33.29,-34.63,-24.18,-23.78,-22.37,-23.97,-34.12,-25.25,-22.87,-18.48,-21.46,-28.56,-28.56,-21.3,-20.08,-18.82,-19.51,-12.05,-17.4,-23.93,-21.23,-16.23,-28.15,-20.81,-20.72,-23.29,-38.46,-15.48,-37.03,-20.48,-18.12,-18.17,-11.4,-23.1,-14.28,-22.87,-17.59,-27.6,-17.94,-17.88,-30.01,-19.19,-18.14,-23.46,-18.44,-18.21,-18.26,-15.85,-23.82,-18.6,-17.8,-10.78,-18.12,-19.34,-15.34,-24.97,-15.97,-23.47,-23.11,-20.54,-18.92,-20.16,-25.48,-18.19,-15.35,-18.69,-18.89,-17.61,-20.93,-17.6,-17.96,-18.8,-20.61,-20.74,-25.23,-23.9,-18.07,-15.43,-14.3,-18.04,-13.9,-17.64,-17.98,-25,-19.45,-16.11,-23.73,-17.74,-21.56,-20.97,-15.45,-15.93,-21.47,-21.44,-22.16,-13.36,-21.22,-26.1,-18.35,-17.2,-22.42,-17.91,-26.53,-26.5,-16.31,-18.76,-17.1,-19.28,-23.5,-21.26,-17.97,-26.02,-30.3,-24.89,-14.57,-15.4,-22.06,-25.14,-20.3,-25.28,-20.63,-19.02,-22.1,-38.59,-19.3,-31.03,-30.51,-22.55,-22.14,-25.6,-18.04,-21.29,-21.08,-20.64,-24.41,-12.16,-17.1,-21.13,-12.34,-16.43,-20.7,-21.18,-17.78,-21.57,-13.7,-12.27,-19.1,-19.85,-11.37,-20.7,-20.24,-16.4,-19.6,-21.63,-21.6,-21.77,-21.8,-21.05,-10.8,-17.9,-22.26,-22.33,-24.04,-20.4,-15,-27.87,-14.12,-23.61,-21.56,-21.19,-18.07,-26,-20.21,-28,-20.74,-31.8,-18.91,-20.45,-22.9,-18.11,-23.8,-23.42,-23.2,-12.93,-21.14,-19.13,-21.08,-20.07,-20.9,-25.04,-21.85,-19.34,-15.83,-23.73,-18.1,-22.12,-15.39,-16.21,-21.75,-22.1,-24.97,-19.36,-22.14,-21.48,-18.54,-21.62,-13.4,-15.5,-15.67,-21.78,-30.63,-15.7,-19.2,-19.7,-19.4,-15.85,-17.38,-24.33,-20.89,-18.97,-17.99,-15.8,-25.42,-21.6,-26.06,-17.56,-25.63,-25.46,-22.23,-21.55,-15.18,-13.79,-15.18,-18.78,-17.9,-18.5,-14.82,-15.65,-30.01,-13.16,-21.03,-21.4,-17.93,-20.87,-12.01,-19.1,-22.85,-17.08,-21.14,-12.23,-20.91,-11.38,-11.02,-22.09,-17.8,-18.94,-18.85,-21.91,-22.03,-18.1,-18.4,-21.2,-12,-11.7,-26.72,-24.39,-19.64,-21.35,-22.82,-38.28,-12.57,-22.24,-13.8,-21.07,-17.74,-23.87,-21.29,-22.2,-15.24,-17.82,-32.14,-19.3,-33.09,-20.18,-17.46,-17.44,-24.71,-21.53,-19.17,-28.05,-23.39,-22.33,-15.28,-20.27,-10.96,-21.52,-19.57,-23.08,-25.06,-17.85,-15.99,-20.56,-17.98,-18.4,-27.64,-20.99,-14.86,-29.33,-25.81,-14.1,-17.63,-23.47,-23.92,-20.88,-20.25,-19.33,-18.14,-22.41,-20.77,-17.95,-20.83,-27.84,-19.94,-23.6,-23.7,-30.39,-18.98,-27.89,-23.5,-23.73,-17.93,-35.94,-18.68,-23.47,-23.49,-23.85,-27.08,-20.88,-20.97,-21.71,-23.9,-15.78,-12.57,-19.69,-22.04,-17.99,-23.5,-21.4,-15.86,-23.95,-25.79,-23.75,-24.1,-18.56,-23.3,-17.03,-20.77,-28.1,-18.83,-23,-20.82,-22.95,-28.22,-27.99,-15.54,-12.37,-22.33,-22.7,-17.86,-16,-20.73,-15.45,-20.05,-17.95,-17.7,-25.93,-12.28,-20.13,-17.4,-21.59],[181.62,181.03,184.1,181.66,181.96,184.31,166.1,181.93,181.74,179.59,180.69,167,182.11,181.66,169.92,184.95,165.96,181.5,179.78,180.31,181.16,166.32,180.16,182,180.28,181.49,167.51,180.79,181.47,182.37,179.24,166.74,185.05,180.8,186,179.33,169.23,181.28,181.4,169.33,176.78,186.1,179.82,186.04,169.41,182.3,181.7,166.32,180.08,185.25,182.35,184.42,173.2,180.67,182.16,182.13,181,180.6,181.35,179.2,181.55,182.4,172.38,166.22,181.41,184.93,181.6,179.62,181.86,187.81,185.8,184.35,166.2,179.99,181.23,180.04,184.7,167.06,181.71,181.11,180.21,180.99,182.38,183.4,181.7,184.31,170.5,179.96,186.3,186.44,167.53,167.06,182.02,169.71,185.26,182.4,181.11,183.41,166.54,179.92,185.61,178.41,180.39,181.6,180.69,183.5,180.6,169.49,185.9,177.81,185.23,182.31,182.45,178.3,178.35,178.31,172.23,172.29,167.4,169.48,166.97,178.9,180.4,182.43,180.6,167.89,183.84,178.57,181.7,183.51,185.43,181.22,168.98,180.3,180.82,168.02,187.32,182.8,182.6,184.16,169.46,181.4,167.1,181.43,173.5,184.4,185.17,173.49,180.17,181.5,184.5,167.62,182.56,165.8,167.68,181.32,166.07,180,169.84,166.24,180.5,179.52,167.16,180.2,179.9,179.43,182.12,183.84,180,169.42,181.83,180.34,180.9,184.68,182.29,180.2,180.64,185.16,181.48,184.24,181.75,183.5,184.3,183,181.85,187.09,181.9,181.85,179.88,185.13,184.09,169.31,182,179.5,179.61,181.19,182.53,182.75,181.74,180.3,182.18,182.2,183.59,183.35,169.09,182.32,180.54,181.69,180.62,182.3,180.13,184.1,181.71,185.68,180.27,181.58,182.4,181.52,183.83,182.39,185.7,171.65,184.48,182.1,180.16,166.66,182.9,185.75,182.53,171.52,180.94,180.81,182.82,185.35,180.13,179.93,182.68,180.63,166.53,180.22,182.74,182.84,166,183.68,185.51,181.67,181.65,186.9,180.01,169.5,166.26,167.24,181.38,170.4,182.1,180.88,184.89,169.33,179.36,179.89,184.23,181.51,169.01,181.47,183.05,184.2,167.24,168.8,182.37,180.85,181.41,180.38,179.9,181.99,180.38,181.4,180.18,179.22,180.52,182.51,180.1,180.54,177.77,185,184.68,179.85,180.6,185.32,181.57,182.28,181.49,166.2,181.5,179.69,186.21,185.86,178.4,181.51,181.2,169.32,169.28,184.14,185.74,181.38,171.39,179.7,181.36,180.53,181.39,181.5,169.58,169.63,181.91,181.41,183.78,181.02,181.03,169.24,179.5,167.1,167.32,183.48,182.04,182.31,166.36,182.3,181.2,165.77,185.77,166.24,183.87,180,182.6,166.6,179.07,182.18,182.1,182.18,182.38,182.18,182.28,181.7,182.5,182.5,182.39,182.47,182.4,182.39,185.48,182.43,182.61,166.29,181.32,182.02,182.36,181.32,171.4,182.68,182.53,166.47,181.58,185.72,179.6,179.9,169.21,183.61,182.37,183.2,182.51,182.93,179.99,184.08,181.09,181.4,184.06,186.75,181.6,186.66,186.42,186.71,167.95,167.14,182.82,167.33,182.01,181.66,181.49,180.98,165.99,183.88,186.16,183.68,181.26,181.9,181.2,179.6,181.42,188.13,181.3,170.3,182.16,166.14,181.4,178.59,184.5,181.5,182.3,167.51,180.23,181.6,186.8,184.56,169.14,180.1,185.2,167.26,167.26,181.7,181.8,186.2,180.38,182.77,186.8,179.71,180.9,182.4,181.24,182.6,169.15,180.96,183.4,180.26,182.23,178.47,183.2,182.93,169.48,182.3,182.04,185.32,166.37,184.68,168.52,182.54,183.81,183.52,185.64,181.59,181.5,180.15,182.5,179.68,167.7,182.8,184.7,167.32,181.59,185.6,179.99,180.63,186.8,180.62,180.7,180.86,181.16,181.9,167.5,185.43,181.11,180.57,184.36,185.48,185.94,166.06,185.9,181.6,177.47,183.2,180.23,185.2,180.68,184.87,183.3,181.21,181.3,183.4,180.5,181.2,181.13,170.62,181.63,169.04,180.23,183.54,185.31,172.91,185.3,181.2,180.22,184.46,187.1,186.3,183.81,166.87,180.09,182.3,165.98,165.96,165.76,180.02,183.63,184.28,187,180.17,181.82,187.2,166.02,184.52,186.9,179.79,185.77,182.54,183.33,167.38,181.15,180.84,167.18,167.01,183.13,180.8,167.01,166.83,183.2,166.94,184.6,167.25,181.31,166.69,167.34,181.59,167.42,166.9,166.85,166.8,166.91,167.54,166.18,181.91,187.15,181.41,182.22,168.71,166.62,184.61,184.6,184.42,184.46,183.95,180.47,166.49,181.57,184.47,182.1,182.8,180.97,183.91,182.26,181.18,183.84,179.82,167.26,187.55,182.41,186.51,182.04,187.8,181.31,181.69,182.64,183.4,167.16,181.33,166.36,181.87,181.25,186.74,168.75,179.87,181.42,179.27,181.06,181.9,167.15,166.28,185,169.76,166.78,182.93,182.39,184.03,181.96,182.25,180.81,180.86,174.46,179.8,185.5,185.62,180.92,180.2,182.4,170.99,168.98,181.87,186.26,181.53,184.91,168.69,181.54,165.67,181.3,179.1,179.02,180.31,171.5,179.91,181.75,179.86,172.65,182.37,181.02,183.47,183.59,180.92,183.22,182.21,183.97,167.39,186.54,180.18,181.09,167.91,183.4,185.01,181.41,184,176.03,186.73,177.52,181.38,181.88,181.98,166.07,180.12,170.34,171.72,180.98,182.1,180.6,180.58,180.8,182.3,180.87,180.11,181.04,180.87,180.98,184.83,180.09,184.28,181.32,166.1,181.71,182.62,167.1,182.85,186.08,180.24,179.15,181.66,169.37,184.27,180.94,181.74,186.4,169.1,181.24,183.32,181.54,181.5,181.4,182.41,182.44,181.53,179.86,179.9,181.58,185.19,167.32,181.57,167.18,177.01,181.51,180,184.48,187.48,179.98,186.78,183.23,181.72,186.73,167.91,185.86,170.45,180.49,172.76,181.51,182.5,185.27,182.9,171.4,181.48,178.3,178.29,168.08,169.71,182.8,182.78,180,181.69,181.48,181.2,180.8,179.67,167.24,186.87,183.95,178.42,181.4,181.17,181.61,186.83,185.3,175.7,183,181.59,181.3,183.34,180.64,180.3,181.84,185.77,180.85,169.66,180.03,167.03,185.9,185.6,167.43,186.73,184.3,180.92,185.33,183.86,166.75,167.41,184.52,184.51,166.55,186.3,185.1,182.73,184.53,180.77,180.5,181,183.6,180.9,165.8,181.5,171.44,171.46,184.85,186.1,184.62,183.4,166.64,180.27,185.5,181.58,181.65,178.43,181.9,182,180.7,180.6,169.46,182.1,183.8,181.63,184.7,180.21,184.8,169.52,181.06,184.97,181.3,181.75,182.02,179.84,180.89,186.59,167.1,183,181.72,180.49,185.1,186.52,180.67,180.4,179.54,186.36,179.62,182.44,168.93,182.4,166.9,185.3,185.23,183.11,180.9,185.1,184.37,182.44,182.29,185.9,168.63,179.97,185.26,169.44,181.62,185.25,182.65,169.9,180.05,181.23,180.26,179.98,180.48,181.39,185.93,166.56,167.23,186.72,181.41,185.4,171.17,185.17,181.15,167.24,180.78,180.78,181.89,181.7,166.66,169.63,181.37,185.96,174.21,167.02,181.57,167.05,167.01,180.58,181.2,182.43,182.2,181.28,179.77,181.63,184.84,181.4,166.2,166.3,182.69,178.98,169.5,170.04,184.52,177.1,167.11,180.28,166.53,183.78,181.25,180.15,185.8,180.58,185.11,181.27,180,185.86,180.94,181.62,181.42,181.33,179.85,170.52,169.53,182.39,179.97,171.51,185.98,181.51,165.97,169.75,184.47,183.45,182.8,181.44,167.95,184.41,181.61,181.77,182.22,181.02,167.32,182.72,182.54,166.01,185.13,180.21,180.21,185.18,184.75,186.16,181.71,183.99,181.16,181.73,181.01,182.1,182.39,183.99,184.13,182.4,182.32,182.92,184.9,184.49,181.62,178.52,184.5,179.95,180.06,180.26,183.44,184.95,181.2,183.58,184.6,167.44,166.72,184.23,183.95,181.59,180.13,180.74,166.98,184.64,182.38,184.5,184.5,169.05,184.68,185.74,183.71,183.5,182.26,170.7,181.67,170.56,183.6,183.5,187.15,166.93,171.66,170.3,181.3,184.53,181.42,181.42,183.86,181.37,188.1,179.54,167.06,184.2,187.8,170.56],null,null,\"basic\",{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"addProviderTiles\",\"args\":[\"Esri.WorldTopoMap\",null,\"detail\",{\"errorTileUrl\":\"\",\"noWrap\":false,\"detectRetina\":false}]},{\"method\":\"addCircleMarkers\",\"args\":[[-20.42,-20.62,-26,-17.97,-20.42,-19.68,-11.7,-28.11,-28.74,-17.47,-21.44,-12.26,-18.54,-21,-20.7,-15.94,-13.64,-17.83,-23.5,-22.63,-20.84,-10.98,-23.3,-30.2,-19.66,-17.94,-14.72,-16.46,-20.97,-19.84,-22.58,-16.32,-15.55,-23.55,-16.3,-25.82,-18.73,-17.64,-17.66,-18.82,-37.37,-15.31,-24.97,-15.49,-19.23,-30.1,-26.4,-11.77,-24.12,-18.97,-18.75,-19.26,-22.75,-21.37,-20.1,-19.85,-22.7,-22.06,-17.8,-24.2,-20.69,-21.16,-13.82,-11.49,-20.68,-17.1,-20.14,-21.96,-20.42,-15.46,-15.31,-19.86,-11.55,-23.74,-17.7,-23.54,-19.21,-12.11,-21.81,-28.98,-34.02,-23.84,-19.57,-20.12,-17.7,-19.66,-21.5,-23.64,-15.43,-15.41,-15.48,-13.36,-20.64,-19.72,-15.44,-19.73,-27.24,-18.16,-13.66,-24.57,-16.98,-26.2,-21.88,-33,-21.33,-19.44,-34.89,-20.24,-22.55,-36.95,-15.75,-16.85,-19.06,-26.11,-26.2,-26.13,-13.66,-13.47,-14.6,-18.96,-14.65,-19.9,-22.05,-19.22,-31.24,-17.93,-19.3,-26.53,-27.72,-19.19,-17.43,-17.05,-19.52,-23.71,-21.3,-16.24,-16.14,-23.95,-25.2,-18.84,-12.66,-20.65,-13.23,-29.91,-14.31,-20.1,-17.8,-21.27,-23.58,-17.9,-23.34,-15.56,-23.83,-11.8,-15.54,-20.65,-11.75,-24.81,-20.9,-11.34,-17.98,-24.34,-13.86,-35.56,-35.48,-34.2,-26,-19.89,-23.43,-18.89,-17.82,-25.68,-20.2,-15.2,-15.03,-32.22,-22.64,-17.42,-17.84,-15.02,-18.04,-24.6,-19.88,-20.3,-20.45,-17.67,-22.3,-19.85,-24.27,-15.85,-20.02,-18.56,-17.87,-24.08,-32.2,-20.36,-23.85,-24,-20.41,-17.72,-19.67,-17.7,-16.23,-26.72,-12.95,-21.97,-21.96,-20.32,-30.28,-20.2,-30.66,-16.17,-28.25,-20.47,-23.55,-20.94,-26.67,-18.13,-20.21,-18.31,-16.52,-22.36,-22.43,-20.37,-23.77,-13.65,-21.55,-16.24,-23.73,-22.34,-19.4,-24.64,-16,-19.62,-23.84,-23.54,-28.23,-21.68,-13.44,-24.96,-20.08,-24.36,-14.7,-18.2,-16.65,-18.11,-17.95,-15.5,-23.36,-19.15,-10.97,-14.85,-17.8,-22.5,-29.1,-20.32,-16.09,-19.18,-23.81,-23.79,-19.02,-20.9,-19.06,-17.88,-19.41,-26.17,-14.95,-18.73,-20.21,-21.29,-19.76,-22.09,-23.8,-20.16,-22.13,-17.44,-23.33,-24.78,-22,-19.13,-30.72,-22.32,-16.45,-17.7,-17.95,-24.4,-19.3,-21.13,-18.07,-20.6,-18.48,-13.34,-20.92,-25.31,-15.24,-16.4,-24.57,-17.94,-30.64,-18.64,-13.09,-19.68,-16.44,-21.09,-14.99,-23.3,-17.68,-22,-21.38,-32.62,-13.05,-12.93,-18.6,-21.34,-21.48,-17.4,-17.32,-18.77,-26.16,-12.59,-14.82,-21.79,-19.83,-29.5,-12.49,-26.1,-21.04,-10.78,-20.76,-11.41,-19.1,-23.91,-27.33,-12.25,-23.49,-27.18,-25.8,-27.19,-27.27,-27.1,-27.22,-27.38,-27.27,-27.54,-27.2,-27.71,-27.6,-27.38,-21.54,-27.21,-28.96,-12.01,-17.46,-30.17,-27.27,-17.79,-22.19,-17.1,-27.18,-11.64,-17.98,-16.9,-21.98,-32.14,-18.8,-26.78,-20.43,-18.3,-15.83,-23.44,-23.73,-19.89,-17.59,-19.77,-20.31,-15.33,-18.2,-15.36,-15.29,-15.36,-16.24,-13.47,-25.5,-14.32,-20.04,-28.83,-17.82,-27.23,-10.72,-27,-20.36,-27.17,-20.94,-17.46,-21.04,-23.7,-17.72,-15.87,-17.84,-13.45,-30.8,-11.63,-30.4,-26.18,-15.7,-17.95,-20.51,-15.36,-23.61,-33.2,-17.68,-22.24,-20.07,-25.04,-21.5,-14.28,-14.43,-32.7,-34.1,-19.7,-24.19,-26.6,-17.04,-22.1,-32.6,-33,-20.58,-20.61,-19.47,-17.47,-18.4,-23.33,-18.55,-26.16,-21.8,-27.63,-18.89,-20.3,-20.56,-16.1,-12.66,-21.05,-17.97,-19.83,-22.55,-22.28,-15.72,-20.85,-21.11,-25.31,-26.46,-24.09,-16.96,-23.19,-20.81,-15.03,-18.06,-19,-23.53,-18.18,-15.66,-18,-18.08,-18.05,-29.9,-20.9,-15.61,-16.03,-17.68,-31.94,-19.14,-18,-16.95,-10.79,-20.83,-32.9,-37.93,-29.09,-23.56,-19.6,-21.39,-14.85,-22.7,-32.42,-17.9,-23.58,-34.4,-17.61,-21.07,-13.84,-30.24,-18.49,-23.45,-16.04,-17.14,-22.54,-15.9,-30.04,-24.03,-18.89,-16.51,-20.1,-21.06,-13.07,-23.46,-19.41,-11.81,-11.76,-12.08,-25.59,-26.54,-20.9,-16.99,-23.46,-17.81,-15.17,-11.67,-20.75,-19.5,-26.18,-20.66,-19.22,-24.68,-15.43,-32.45,-21.31,-15.44,-13.26,-15.26,-33.57,-15.77,-15.79,-21,-16.28,-23.28,-16.1,-17.7,-15.96,-15.95,-17.56,-15.9,-15.29,-15.86,-16.2,-15.71,-16.45,-11.54,-19.61,-15.61,-21.16,-20.65,-20.33,-15.08,-23.28,-23.44,-23.12,-23.65,-22.91,-22.06,-13.56,-17.99,-23.92,-30.69,-21.92,-25.04,-19.92,-27.75,-17.71,-19.6,-34.68,-14.46,-18.85,-17.02,-20.41,-18.18,-16.49,-17.74,-20.49,-18.51,-27.28,-15.9,-20.57,-11.25,-20.04,-20.89,-16.62,-20.09,-24.96,-20.95,-23.31,-20.95,-21.58,-13.62,-12.72,-21.79,-20.48,-12.84,-17.02,-23.89,-23.07,-27.98,-28.1,-21.24,-21.24,-19.89,-32.82,-22,-21.57,-24.5,-33.03,-30.09,-22.75,-17.99,-19.6,-15.65,-17.78,-22.04,-20.06,-18.07,-12.85,-33.29,-34.63,-24.18,-23.78,-22.37,-23.97,-34.12,-25.25,-22.87,-18.48,-21.46,-28.56,-28.56,-21.3,-20.08,-18.82,-19.51,-12.05,-17.4,-23.93,-21.23,-16.23,-28.15,-20.81,-20.72,-23.29,-38.46,-15.48,-37.03,-20.48,-18.12,-18.17,-11.4,-23.1,-14.28,-22.87,-17.59,-27.6,-17.94,-17.88,-30.01,-19.19,-18.14,-23.46,-18.44,-18.21,-18.26,-15.85,-23.82,-18.6,-17.8,-10.78,-18.12,-19.34,-15.34,-24.97,-15.97,-23.47,-23.11,-20.54,-18.92,-20.16,-25.48,-18.19,-15.35,-18.69,-18.89,-17.61,-20.93,-17.6,-17.96,-18.8,-20.61,-20.74,-25.23,-23.9,-18.07,-15.43,-14.3,-18.04,-13.9,-17.64,-17.98,-25,-19.45,-16.11,-23.73,-17.74,-21.56,-20.97,-15.45,-15.93,-21.47,-21.44,-22.16,-13.36,-21.22,-26.1,-18.35,-17.2,-22.42,-17.91,-26.53,-26.5,-16.31,-18.76,-17.1,-19.28,-23.5,-21.26,-17.97,-26.02,-30.3,-24.89,-14.57,-15.4,-22.06,-25.14,-20.3,-25.28,-20.63,-19.02,-22.1,-38.59,-19.3,-31.03,-30.51,-22.55,-22.14,-25.6,-18.04,-21.29,-21.08,-20.64,-24.41,-12.16,-17.1,-21.13,-12.34,-16.43,-20.7,-21.18,-17.78,-21.57,-13.7,-12.27,-19.1,-19.85,-11.37,-20.7,-20.24,-16.4,-19.6,-21.63,-21.6,-21.77,-21.8,-21.05,-10.8,-17.9,-22.26,-22.33,-24.04,-20.4,-15,-27.87,-14.12,-23.61,-21.56,-21.19,-18.07,-26,-20.21,-28,-20.74,-31.8,-18.91,-20.45,-22.9,-18.11,-23.8,-23.42,-23.2,-12.93,-21.14,-19.13,-21.08,-20.07,-20.9,-25.04,-21.85,-19.34,-15.83,-23.73,-18.1,-22.12,-15.39,-16.21,-21.75,-22.1,-24.97,-19.36,-22.14,-21.48,-18.54,-21.62,-13.4,-15.5,-15.67,-21.78,-30.63,-15.7,-19.2,-19.7,-19.4,-15.85,-17.38,-24.33,-20.89,-18.97,-17.99,-15.8,-25.42,-21.6,-26.06,-17.56,-25.63,-25.46,-22.23,-21.55,-15.18,-13.79,-15.18,-18.78,-17.9,-18.5,-14.82,-15.65,-30.01,-13.16,-21.03,-21.4,-17.93,-20.87,-12.01,-19.1,-22.85,-17.08,-21.14,-12.23,-20.91,-11.38,-11.02,-22.09,-17.8,-18.94,-18.85,-21.91,-22.03,-18.1,-18.4,-21.2,-12,-11.7,-26.72,-24.39,-19.64,-21.35,-22.82,-38.28,-12.57,-22.24,-13.8,-21.07,-17.74,-23.87,-21.29,-22.2,-15.24,-17.82,-32.14,-19.3,-33.09,-20.18,-17.46,-17.44,-24.71,-21.53,-19.17,-28.05,-23.39,-22.33,-15.28,-20.27,-10.96,-21.52,-19.57,-23.08,-25.06,-17.85,-15.99,-20.56,-17.98,-18.4,-27.64,-20.99,-14.86,-29.33,-25.81,-14.1,-17.63,-23.47,-23.92,-20.88,-20.25,-19.33,-18.14,-22.41,-20.77,-17.95,-20.83,-27.84,-19.94,-23.6,-23.7,-30.39,-18.98,-27.89,-23.5,-23.73,-17.93,-35.94,-18.68,-23.47,-23.49,-23.85,-27.08,-20.88,-20.97,-21.71,-23.9,-15.78,-12.57,-19.69,-22.04,-17.99,-23.5,-21.4,-15.86,-23.95,-25.79,-23.75,-24.1,-18.56,-23.3,-17.03,-20.77,-28.1,-18.83,-23,-20.82,-22.95,-28.22,-27.99,-15.54,-12.37,-22.33,-22.7,-17.86,-16,-20.73,-15.45,-20.05,-17.95,-17.7,-25.93,-12.28,-20.13,-17.4,-21.59],[181.62,181.03,184.1,181.66,181.96,184.31,166.1,181.93,181.74,179.59,180.69,167,182.11,181.66,169.92,184.95,165.96,181.5,179.78,180.31,181.16,166.32,180.16,182,180.28,181.49,167.51,180.79,181.47,182.37,179.24,166.74,185.05,180.8,186,179.33,169.23,181.28,181.4,169.33,176.78,186.1,179.82,186.04,169.41,182.3,181.7,166.32,180.08,185.25,182.35,184.42,173.2,180.67,182.16,182.13,181,180.6,181.35,179.2,181.55,182.4,172.38,166.22,181.41,184.93,181.6,179.62,181.86,187.81,185.8,184.35,166.2,179.99,181.23,180.04,184.7,167.06,181.71,181.11,180.21,180.99,182.38,183.4,181.7,184.31,170.5,179.96,186.3,186.44,167.53,167.06,182.02,169.71,185.26,182.4,181.11,183.41,166.54,179.92,185.61,178.41,180.39,181.6,180.69,183.5,180.6,169.49,185.9,177.81,185.23,182.31,182.45,178.3,178.35,178.31,172.23,172.29,167.4,169.48,166.97,178.9,180.4,182.43,180.6,167.89,183.84,178.57,181.7,183.51,185.43,181.22,168.98,180.3,180.82,168.02,187.32,182.8,182.6,184.16,169.46,181.4,167.1,181.43,173.5,184.4,185.17,173.49,180.17,181.5,184.5,167.62,182.56,165.8,167.68,181.32,166.07,180,169.84,166.24,180.5,179.52,167.16,180.2,179.9,179.43,182.12,183.84,180,169.42,181.83,180.34,180.9,184.68,182.29,180.2,180.64,185.16,181.48,184.24,181.75,183.5,184.3,183,181.85,187.09,181.9,181.85,179.88,185.13,184.09,169.31,182,179.5,179.61,181.19,182.53,182.75,181.74,180.3,182.18,182.2,183.59,183.35,169.09,182.32,180.54,181.69,180.62,182.3,180.13,184.1,181.71,185.68,180.27,181.58,182.4,181.52,183.83,182.39,185.7,171.65,184.48,182.1,180.16,166.66,182.9,185.75,182.53,171.52,180.94,180.81,182.82,185.35,180.13,179.93,182.68,180.63,166.53,180.22,182.74,182.84,166,183.68,185.51,181.67,181.65,186.9,180.01,169.5,166.26,167.24,181.38,170.4,182.1,180.88,184.89,169.33,179.36,179.89,184.23,181.51,169.01,181.47,183.05,184.2,167.24,168.8,182.37,180.85,181.41,180.38,179.9,181.99,180.38,181.4,180.18,179.22,180.52,182.51,180.1,180.54,177.77,185,184.68,179.85,180.6,185.32,181.57,182.28,181.49,166.2,181.5,179.69,186.21,185.86,178.4,181.51,181.2,169.32,169.28,184.14,185.74,181.38,171.39,179.7,181.36,180.53,181.39,181.5,169.58,169.63,181.91,181.41,183.78,181.02,181.03,169.24,179.5,167.1,167.32,183.48,182.04,182.31,166.36,182.3,181.2,165.77,185.77,166.24,183.87,180,182.6,166.6,179.07,182.18,182.1,182.18,182.38,182.18,182.28,181.7,182.5,182.5,182.39,182.47,182.4,182.39,185.48,182.43,182.61,166.29,181.32,182.02,182.36,181.32,171.4,182.68,182.53,166.47,181.58,185.72,179.6,179.9,169.21,183.61,182.37,183.2,182.51,182.93,179.99,184.08,181.09,181.4,184.06,186.75,181.6,186.66,186.42,186.71,167.95,167.14,182.82,167.33,182.01,181.66,181.49,180.98,165.99,183.88,186.16,183.68,181.26,181.9,181.2,179.6,181.42,188.13,181.3,170.3,182.16,166.14,181.4,178.59,184.5,181.5,182.3,167.51,180.23,181.6,186.8,184.56,169.14,180.1,185.2,167.26,167.26,181.7,181.8,186.2,180.38,182.77,186.8,179.71,180.9,182.4,181.24,182.6,169.15,180.96,183.4,180.26,182.23,178.47,183.2,182.93,169.48,182.3,182.04,185.32,166.37,184.68,168.52,182.54,183.81,183.52,185.64,181.59,181.5,180.15,182.5,179.68,167.7,182.8,184.7,167.32,181.59,185.6,179.99,180.63,186.8,180.62,180.7,180.86,181.16,181.9,167.5,185.43,181.11,180.57,184.36,185.48,185.94,166.06,185.9,181.6,177.47,183.2,180.23,185.2,180.68,184.87,183.3,181.21,181.3,183.4,180.5,181.2,181.13,170.62,181.63,169.04,180.23,183.54,185.31,172.91,185.3,181.2,180.22,184.46,187.1,186.3,183.81,166.87,180.09,182.3,165.98,165.96,165.76,180.02,183.63,184.28,187,180.17,181.82,187.2,166.02,184.52,186.9,179.79,185.77,182.54,183.33,167.38,181.15,180.84,167.18,167.01,183.13,180.8,167.01,166.83,183.2,166.94,184.6,167.25,181.31,166.69,167.34,181.59,167.42,166.9,166.85,166.8,166.91,167.54,166.18,181.91,187.15,181.41,182.22,168.71,166.62,184.61,184.6,184.42,184.46,183.95,180.47,166.49,181.57,184.47,182.1,182.8,180.97,183.91,182.26,181.18,183.84,179.82,167.26,187.55,182.41,186.51,182.04,187.8,181.31,181.69,182.64,183.4,167.16,181.33,166.36,181.87,181.25,186.74,168.75,179.87,181.42,179.27,181.06,181.9,167.15,166.28,185,169.76,166.78,182.93,182.39,184.03,181.96,182.25,180.81,180.86,174.46,179.8,185.5,185.62,180.92,180.2,182.4,170.99,168.98,181.87,186.26,181.53,184.91,168.69,181.54,165.67,181.3,179.1,179.02,180.31,171.5,179.91,181.75,179.86,172.65,182.37,181.02,183.47,183.59,180.92,183.22,182.21,183.97,167.39,186.54,180.18,181.09,167.91,183.4,185.01,181.41,184,176.03,186.73,177.52,181.38,181.88,181.98,166.07,180.12,170.34,171.72,180.98,182.1,180.6,180.58,180.8,182.3,180.87,180.11,181.04,180.87,180.98,184.83,180.09,184.28,181.32,166.1,181.71,182.62,167.1,182.85,186.08,180.24,179.15,181.66,169.37,184.27,180.94,181.74,186.4,169.1,181.24,183.32,181.54,181.5,181.4,182.41,182.44,181.53,179.86,179.9,181.58,185.19,167.32,181.57,167.18,177.01,181.51,180,184.48,187.48,179.98,186.78,183.23,181.72,186.73,167.91,185.86,170.45,180.49,172.76,181.51,182.5,185.27,182.9,171.4,181.48,178.3,178.29,168.08,169.71,182.8,182.78,180,181.69,181.48,181.2,180.8,179.67,167.24,186.87,183.95,178.42,181.4,181.17,181.61,186.83,185.3,175.7,183,181.59,181.3,183.34,180.64,180.3,181.84,185.77,180.85,169.66,180.03,167.03,185.9,185.6,167.43,186.73,184.3,180.92,185.33,183.86,166.75,167.41,184.52,184.51,166.55,186.3,185.1,182.73,184.53,180.77,180.5,181,183.6,180.9,165.8,181.5,171.44,171.46,184.85,186.1,184.62,183.4,166.64,180.27,185.5,181.58,181.65,178.43,181.9,182,180.7,180.6,169.46,182.1,183.8,181.63,184.7,180.21,184.8,169.52,181.06,184.97,181.3,181.75,182.02,179.84,180.89,186.59,167.1,183,181.72,180.49,185.1,186.52,180.67,180.4,179.54,186.36,179.62,182.44,168.93,182.4,166.9,185.3,185.23,183.11,180.9,185.1,184.37,182.44,182.29,185.9,168.63,179.97,185.26,169.44,181.62,185.25,182.65,169.9,180.05,181.23,180.26,179.98,180.48,181.39,185.93,166.56,167.23,186.72,181.41,185.4,171.17,185.17,181.15,167.24,180.78,180.78,181.89,181.7,166.66,169.63,181.37,185.96,174.21,167.02,181.57,167.05,167.01,180.58,181.2,182.43,182.2,181.28,179.77,181.63,184.84,181.4,166.2,166.3,182.69,178.98,169.5,170.04,184.52,177.1,167.11,180.28,166.53,183.78,181.25,180.15,185.8,180.58,185.11,181.27,180,185.86,180.94,181.62,181.42,181.33,179.85,170.52,169.53,182.39,179.97,171.51,185.98,181.51,165.97,169.75,184.47,183.45,182.8,181.44,167.95,184.41,181.61,181.77,182.22,181.02,167.32,182.72,182.54,166.01,185.13,180.21,180.21,185.18,184.75,186.16,181.71,183.99,181.16,181.73,181.01,182.1,182.39,183.99,184.13,182.4,182.32,182.92,184.9,184.49,181.62,178.52,184.5,179.95,180.06,180.26,183.44,184.95,181.2,183.58,184.6,167.44,166.72,184.23,183.95,181.59,180.13,180.74,166.98,184.64,182.38,184.5,184.5,169.05,184.68,185.74,183.71,183.5,182.26,170.7,181.67,170.56,183.6,183.5,187.15,166.93,171.66,170.3,181.3,184.53,181.42,181.42,183.86,181.37,188.1,179.54,167.06,184.2,187.8,170.56],[24,21,27,20.5,20,20,24,22,23.5,21.5,22,23,22,22,30.5,21.5,30,22.5,22,22,22.5,21,22,23.5,27,20,23,26,22.5,22,23,23.5,24,20,22.5,21.5,22.5,23,20.5,22,23.5,23,22,21.5,23,24.5,22.5,22,21.5,25.5,21,20,23,21.5,21,22,22.5,20,22,21.5,23.5,20.5,25,23,24.5,23.5,20.5,25,22.5,27.5,20,22.5,21.5,26,22,21.5,20.5,22.5,21,26.5,26,22.5,23,21.5,20,21.5,23.5,22.5,21,21.5,25.5,23.5,26,21,21,20,22.5,26,25.5,23.5,20.5,23,23.5,23.5,23,21,22,23,28.5,25,22.5,21,20,24,22,21,26.5,23.5,24,21,24,21.5,23.5,22.5,22,25.5,21,25,24,21.5,22.5,21,22.5,23,21.5,23.5,25.5,23,24.5,21,23,20,25,22,21,21,22,24.5,26.5,20,28.5,32,21.5,21,23.5,23.5,21,21.5,24.5,23,20.5,24,23,23,24,25,28,26.5,23.5,22.5,21.5,23,20.5,20.5,20.5,28.5,25,22.5,20.5,23,22.5,21.5,22,21,20.5,24.5,21.5,24.5,23,23,26.5,23.5,23,20.5,23,21,23,22.5,21.5,26,21.5,20,23.5,22.5,22.5,21.5,26,22.5,23.5,21,23.5,21.5,20.5,27,21.5,21.5,21,23,22,21,23.5,23,24.5,21,22.5,24.5,21,22.5,25,25,23.5,21.5,22,24.5,22.5,20,22,25,23.5,24,22.5,20.5,26.5,24,25,23,21.5,23.5,26.5,21,23.5,22.5,25.5,24.5,22,21,23,23.5,21,24.5,25.5,23.5,22,22,21,24.5,23,22,23,22.5,22,24.5,20.5,21,28.5,23,25,21.5,22.5,26,22,21,23,20,22,23.5,21,23.5,22.5,25,25,24,23,23,25,25,28,20,20,23,22,24,23.5,23,21.5,23.5,20.5,24.5,23,24,24.5,25.5,27,22.5,24.5,22,20.5,26.5,22.5,24.5,24,26,22,22,24.5,22,21,23,23,26.5,26.5,22.5,22,25,25.5,22.5,22.5,27,22.5,23.5,21,24,22.5,21.5,21.5,21.5,23,22.5,25,23,23,24.5,20.5,27.5,23.5,25,25.5,27.5,23,23.5,21,20,27,21.5,22,23,25.5,22.5,21,20.5,25.5,27,25.5,25.5,22,28.5,22,25.5,23,27.5,25.5,22,25,25,25.5,25.5,21,22.5,20,24.5,21.5,24,22,21,24.5,21,26.5,25,28.5,26.5,23.5,23,21.5,27,22,21.5,21.5,23.5,22,21,22.5,24,24,21.5,22,25.5,22,22,21.5,24,21.5,22.5,20.5,25.5,23.5,23,23.5,23,22,21,20.5,23.5,20,24,22,21.5,22,22.5,22.5,23.5,21.5,23.5,24,23,25.5,23.5,21.5,25.5,27.5,22.5,21.5,21.5,23.5,21.5,21.5,23,22.5,22.5,27,23,22,25,26,22,25.5,22,22,24,22,23.5,23.5,22,21.5,25,22.5,23,27,23,22.5,22,22.5,20.5,20,24.5,20.5,26,22,20.5,24.5,23,22.5,24,21,21,20.5,27.5,22,24,21,24,24.5,23,22.5,22,23,21,23.5,22,22.5,24.5,23.5,27.5,23.5,23,20.5,23.5,23,21.5,22,23.5,21.5,20.5,23.5,22.5,27.5,22.5,23,25.5,22,23.5,27.5,23,20,23,24,23.5,23.5,21,27,23,27.5,21,22.5,22.5,24,23,27,23,25,21.5,21.5,24,23.5,23.5,24,21,21,29.5,23,22.5,24.5,23.5,24.5,26.5,21,21,22.5,26,22.5,28,26,24,22.5,25,22,22.5,23,22.5,26,25.5,24,21.5,25.5,23.5,23,24,23,22,23,25.5,21.5,22,23.5,24,20.5,23,24.5,20,23.5,23.5,26,23,23,24.5,28.5,23.5,22,24.5,24,23,22,24,23.5,21,25.5,24,24.5,25.5,21.5,22,23.5,23.5,26.5,25.5,24.5,22.5,23.5,21,25.5,24,21,24,22,22.5,21.5,28,20,25,21,23,23,22.5,25,23.5,23,24,23,22,28,21,27,24,28,22,23.5,23,25.5,23,22.5,21,24,24.5,27.5,25,21,26,24,22,24,22,20.5,24.5,23,22.5,26.5,24,23,24,23.5,24.5,26.5,22,23,21.5,22,21,20.5,21,25,20.5,21.5,26,21,22.5,22,22,25,20,24,25,21,26,26,22.5,21.5,22.5,23,25.5,22,21.5,23.5,28,24.5,25.5,23,22,24,21,23.5,20.5,23.5,20,24.5,25,22.5,22,20,22.5,23.5,22,23.5,23.5,20,21,22.5,23.5,22.5,20.5,23,21.5,23,26,23,23.5,25,26,22,23,22.5,20,21,26.5,29.5,24.5,22.5,22,27,26.5,25.5,20.5,21.5,22.5,20.5,25.5,26.5,22.5,20.5,22,23.5,20,25.5,20,21.5,21.5,20,20.5,22,21.5,21,20,22.5,23.5,25,21.5,25.5,23.5,26.5,25,22.5,25,20.5,24.5,20.5,20,22,22.5,22,22.5,21.5,21.5,25,22.5,22.5,22,22.5,20.5,24.5,23.5,21.5,23,23,26,22.5,21.5,23,20,22.5,24,23,20.5,24.5,23.5,20.5,21.5,22,20,24,22,22,23,21,20.5,21,20,20.5,20.5,23.5,24,25.5,25,24,22,25,26,21,20.5,24,22.5,25,25.5,20.5,23.5,26,24,22.5,20,23.5,20.5,21.5,21.5,20,23.5,20.5,21,24,24,21,21,28.5,30,21,22.5,24.5,22,20,21.5,21,22.5,24,22,21,21,25,21,26,22.5,23,25,25,27,24,21,27.5,21.5,20.5,22,24.5,22.5,24.5,20,22.5,25,24.5,22.5,21,21,21,26,21.5,25.5,23,23,22,22,24.5,25.5,21,23.5,20,28,26.5,25,21.5,20.5,25.5,22.5,24.5,27,23.5,24,22.5,21,23,23,28,27,20,26,21,23.5,21.5,24,23,27,24,23,21,27.5,23.5,23.5,22.5,27.5,22.5,20.5,20,21.5,23.5,24.5,22.5,23.5,22.5,24,21.5,20.5,27,20.5,24,21,24,27,22,26,23.5,24.5,24.5,21,22,22,21.5,24.5,25,23.5,24.5,21.5,22.5,21,26,24,20,23.5,21.5,21.5,24.5,20,21,22,23.5,22.5,22.5,30],null,\"detail\",{\"interactive\":true,\"className\":\"\",\"stroke\":false,\"color\":[\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\"],\"fillOpacity\":0.5},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"setGroupOptions\",\"args\":[\"detail\",{\"zoomLevels\":[7,8,9,10,11,12,13,14,15,16,17,18]}]}],\"limits\":{\"lat\":[-38.59,-10.72],\"lng\":[165.67,188.13]}},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/iconList.html","id":null,"dir":"Reference","previous_headings":"","what":"Make icon set — iconList","title":"Make icon set — iconList","text":"Make icon set","code":""},{"path":"https://rstudio.github.io/leaflet/reference/iconList.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Make icon set — iconList","text":"","code":"iconList(...)"},{"path":"https://rstudio.github.io/leaflet/reference/iconList.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Make icon set — iconList","text":"... icons created makeIcon()","code":""},{"path":"https://rstudio.github.io/leaflet/reference/iconList.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Make icon set — iconList","text":"","code":"iconSet <- iconList( red = makeIcon(\"leaf-red.png\", iconWidth = 32, iconHeight = 32), green = makeIcon(\"leaf-green.png\", iconWidth = 32, iconHeight = 32) ) iconSet[c(\"red\", \"green\", \"red\")] #> $red #> $iconUrl #> [1] \"leaf-red.png\" #> #> $iconWidth #> [1] 32 #> #> $iconHeight #> [1] 32 #> #> attr(,\"class\") #> [1] \"leaflet_icon\" #> #> $green #> $iconUrl #> [1] \"leaf-green.png\" #> #> $iconWidth #> [1] 32 #> #> $iconHeight #> [1] 32 #> #> attr(,\"class\") #> [1] \"leaflet_icon\" #> #> $red #> $iconUrl #> [1] \"leaf-red.png\" #> #> $iconWidth #> [1] 32 #> #> $iconHeight #> [1] 32 #> #> attr(,\"class\") #> [1] \"leaflet_icon\" #> #> attr(,\"class\") #> [1] \"leaflet_icon_set\""},{"path":"https://rstudio.github.io/leaflet/reference/icons.html","id":null,"dir":"Reference","previous_headings":"","what":"Create a list of icon data — icons","title":"Create a list of icon data — icons","text":"icon can represented list form list(iconUrl, iconSize, ...). function vectorized arguments create list icon data. Shorter argument values re-cycled. NULL values arguments ignored.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/icons.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Create a list of icon data — icons","text":"","code":"icons( iconUrl = NULL, iconRetinaUrl = NULL, iconWidth = NULL, iconHeight = NULL, iconAnchorX = NULL, iconAnchorY = NULL, shadowUrl = NULL, shadowRetinaUrl = NULL, shadowWidth = NULL, shadowHeight = NULL, shadowAnchorX = NULL, shadowAnchorY = NULL, popupAnchorX = NULL, popupAnchorY = NULL, className = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/icons.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Create a list of icon data — icons","text":"iconUrl URL file path icon image iconRetinaUrl URL file path retina sized version icon image iconWidth, iconHeight size icon image pixels iconAnchorX, iconAnchorY coordinates \"tip\" icon (relative top left corner, .e., top left corner means iconAnchorX = 0 iconAnchorY = 0), icon aligned point marker's geographical location shadowUrl URL file path icon shadow image shadowRetinaUrl URL file path retina sized version icon shadow image shadowWidth, shadowHeight size shadow image pixels shadowAnchorX, shadowAnchorY coordinates \"tip\" shadow popupAnchorX, popupAnchorY coordinates point popups \"open\", relative icon anchor className custom class name assign icon shadow images","code":""},{"path":"https://rstudio.github.io/leaflet/reference/icons.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Create a list of icon data — icons","text":"list icon data can passed icon argument addMarkers().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/icons.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Create a list of icon data — icons","text":"","code":"library(leaflet) # adapted from https://leafletjs.com/examples/custom-icons.html iconData <- data.frame( lat = c(rnorm(10, 0), rnorm(10, 1), rnorm(10, 2)), lng = c(rnorm(10, 0), rnorm(10, 3), rnorm(10, 6)), group = rep(sort(c(\"green\", \"red\", \"orange\")), each = 10), stringsAsFactors = FALSE ) leaflet() %>% addMarkers( data = iconData, icon = ~ icons( iconUrl = sprintf(\"https://leafletjs.com/examples/custom-icons/leaf-%s.png\", group), shadowUrl = \"https://leafletjs.com/examples/custom-icons/leaf-shadow.png\", iconWidth = 38, iconHeight = 95, shadowWidth = 50, shadowHeight = 64, iconAnchorX = 22, iconAnchorY = 94, shadowAnchorX = 4, shadowAnchorY = 62, popupAnchorX = -3, popupAnchorY = -76 ) ) #> Assuming \"lng\" and \"lat\" are longitude and latitude, respectively {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addMarkers\",\"args\":[[0.8606127123120325,-0.07039664564486807,-0.6131802136401736,-0.3367149598933609,-0.2158401838654685,0.6211322866457577,-1.284026516767093,-1.300092441187019,-0.3767694616563214,0.1037486464046915,0.2964377274177622,2.497413940475217,0.6971731224407478,-0.3768313346372614,1.883170174632431,1.671420279304275,2.230022375032784,2.645467878583005,0.8170739613360879,-0.3792578149375752,3.250600600755403,0.1237632251359568,1.631212431721527,-0.1292973082328839,2.337646026995419,0.4254251524874468,1.803680585151097,2.915060107809174,3.07863653772935,3.452802853952099],[-1.653281089225401,-2.761867517640907,0.2643691635372625,1.02457159426044,-0.6591855479869911,-0.3863043785226719,-0.2424989493525531,0.2205932400716209,-1.481090030207682,0.7246912044701421,0.6224852987382703,2.934590790574021,2.530295186887491,2.719483711932718,3.574836585356691,2.794323153937975,3.234880505242246,3.110628320902131,3.274202232513379,4.574919630070291,6.567767831624168,5.94038775012349,5.850412285405708,6.266168788377474,6.528403242689259,5.420611906885273,6.94219937374031,5.293638639848606,4.724597899666625,6.733259916535147],{\"iconUrl\":{\"data\":[\"https://leafletjs.com/examples/custom-icons/leaf-green.png\",\"https://leafletjs.com/examples/custom-icons/leaf-orange.png\",\"https://leafletjs.com/examples/custom-icons/leaf-red.png\"],\"index\":[0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2]},\"iconWidth\":38,\"iconHeight\":95,\"iconAnchorX\":22,\"iconAnchorY\":94,\"shadowUrl\":{\"data\":\"https://leafletjs.com/examples/custom-icons/leaf-shadow.png\",\"index\":0},\"shadowWidth\":50,\"shadowHeight\":64,\"shadowAnchorX\":4,\"shadowAnchorY\":62,\"popupAnchorX\":-3,\"popupAnchorY\":-76},null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[-1.300092441187019,3.452802853952099],\"lng\":[-2.761867517640907,6.94219937374031]}},\"evals\":[],\"jsHooks\":[]} # \\donttest{ # use point symbols from base R graphics as icons pchIcons <- function(pch = 0:14, width = 30, height = 30, ...) { n <- length(pch) files <- character(n) # create a sequence of png images for (i in seq_len(n)) { f <- tempfile(fileext = \".png\") png(f, width = width, height = height, bg = \"transparent\") par(mar = c(0, 0, 0, 0)) plot.new() points(.5, .5, pch = pch[i], cex = min(width, height) / 8, ...) dev.off() files[i] <- f } files } iconData <- matrix(rnorm(500), ncol = 2) res <- kmeans(iconData, 10) iconData <- cbind(iconData, res$cluster) colnames(iconData) <- c(\"lat\", \"lng\", \"group\") iconData <- as.data.frame(iconData) # 10 random point shapes for the 10 clusters in iconData shapes <- sample(0:14, 10) iconFiles <- pchIcons(shapes, 40, 40, col = \"steelblue\", lwd = 2) # note the data has 250 rows, and there are 10 icons in iconFiles; they are # connected by the `group` variable: the i-th row of iconData uses the # group[i]-th icon in the icon list leaflet() %>% addMarkers( data = iconData, icon = ~ icons( iconUrl = iconFiles[group], popupAnchorX = 20, popupAnchorY = 0 ), popup = ~ sprintf( \"lat = %.4f, long = %.4f, group = %s, pch = %s\", lat, lng, group, shapes[group] ) ) #> Assuming \"lng\" and \"lat\" are longitude and latitude, respectively {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addMarkers\",\"args\":[[-0.4202070943992731,-0.2553750856886408,-0.3692382165043028,1.212448329676568,-0.4453630059572704,1.138667521478022,0.1905234830273359,-1.366393612345354,-1.298102601156062,-2.137098311773513,-0.09620552500409683,0.694509054682261,-0.4745912300326947,1.763130611846386,2.025846063858513,0.4276188086072009,-0.5664793492680703,-0.8338353114637597,0.3982591545196686,-1.47453793146991,-0.3954412004778973,-0.1307024678757356,-1.999493949510331,-0.9959308611995511,0.420113997913957,-0.06286162873619033,-0.08013184849723405,-0.03228341380063453,-0.7189809251408055,-1.116561322532736,-0.7802699025770594,-1.776958528672158,-0.4278348742028892,-2.031027011868338,2.750764752946719,1.513669721154361,0.03398893691222062,0.7407927844096404,-1.270808180134421,-0.1635642319778462,-0.6109454886817877,1.251884191781531,0.2503194657810107,-1.705581680207421,-0.8554131291164022,-0.1449016306166019,-0.3244469582429402,-0.1725649016985262,-1.236062916981359,-1.902304205495255,-0.09450402398686145,0.03255578872739122,0.4612901151996156,1.381400302452626,-0.4164762738728929,0.680942672969972,-0.4143730436766691,-0.5183455097769446,-0.6840197309366717,-0.8856486012970711,0.04923706786969968,0.1855612151113114,-0.6086577894264535,-0.7311028526122243,2.71514421265171,-1.339387040662285,-0.6460152493506238,-0.9324546148031864,-0.7690869282990042,0.3715797827511594,0.3554327828373922,-0.9839984908792494,0.2147295936091625,-0.08008507989284833,-1.422369548746585,1.108148963267345,1.078477638307435,-0.4402503414117352,-0.7781690135619961,-1.818590012109126,-1.12408090423635,1.060523843269576,-1.478700159300311,-1.55156016912671,0.7775066752410458,1.068440137104656,-0.183587701267269,1.558242930972266,-0.2132423842855249,0.9305352643903654,0.4108117961114603,-1.279844297830575,-0.7823666282376297,-2.276083449854667,-0.126395908060913,1.448146706844424,-1.44275737195466,1.467187177035763,-0.7432999011069343,-0.3042238386711698,0.3376580626630231,-0.6075020854562057,-0.2955602703412146,-0.1345371403418327,0.814784366834976,-0.2729217327423396,2.159485796578484,1.091737569000391,0.7433848453491945,-1.207859353220848,0.3278180518891233,-0.5341651057110863,1.283946719283567,0.02893133997575183,-0.3956770690854846,-0.6948683269650554,-1.492080700679909,1.444257235021646,-0.3470173883840132,-0.040259166076385,1.246632110105347,-1.34630152351373,-0.5739012806856504,-0.7059592504796032,-1.857404540848706,-0.2469704806448306,-0.3355609286531535,-0.2493768703645628,0.4595225614486244,-0.46007548080678,0.0589327978627189,-0.7425910818095138,-2.16357400398328,-0.2328964923061294,0.8749068288242858,-0.9734940267500031,-0.5127468641517448,-0.9234879861287549,-1.494425725054262,-0.1659303604082342,1.582238320896474,1.01460226574204,-1.146478342645764,-0.9098491122193325,3.109182684890497,-1.069552774669116,-0.7001095183170118,-0.1984444695562153,0.7436201213265321,-0.05015976689187722,1.313143547213698,0.0860135151819091,-0.6298513723294854,0.6550703292747759,0.01939354926673886,0.6962699609727965,2.008869894731493,-0.05697828331221561,0.2404155043401251,-0.02189016526985176,-0.8308081599467646,1.402474316095725,-0.7238691096385832,1.330580365197691,-0.8113330188112591,1.795036105237782,0.6866263256237155,0.08937800129551228,0.3245477370933477,0.07131812468596369,0.2330483763187205,1.986376576914565,-0.9516707891689564,-0.5586423191880387,0.255814543086576,-0.1980761724650253,0.42878914377244,0.07077011138928845,-1.536653803527901,0.453984370212402,0.8743985675439103,-1.297737567551732,-1.078965236632913,-1.134849940880642,0.02261430747748914,-0.02146122477143903,-0.2787724429376735,-0.02420640614039543,0.8250203020616679,-0.7501827801623862,0.5362104656095469,-1.572717483416155,-0.9864274166591585,1.983512323214224,-1.851378443407981,-0.90978818261984,-1.951440016208645,-0.800276459006774,-1.869361598782836,-0.7505714831039624,-0.5909383854013818,-0.7420992691945617,0.6935120773005082,-0.05946397388741754,-1.863895098644565,-1.274508920390611,-1.781770808398643,-0.5085933893902366,-1.736878286348532,0.04048130345676831,-0.1241794576189968,-0.6127534316899452,0.1606624773969968,-0.6623596320048787,-0.3348516612822843,0.623011585590571,1.028194292444729,-1.134578240310851,0.9169110537572549,1.213874789465611,-0.6859324569719246,-1.09456819339406,0.3648740994660924,-1.008017083210849,0.554996435935428,0.4360659210415374,0.1053732960724887,-0.2537378525819919,-0.9764912318834779,0.394217765983834,1.014903026166746,0.6314438101839203,-0.4833982549352546,-1.526333935666461,0.6168422808601588,1.229286839432942,0.1574530268877342,1.406342055763919,0.3968009171671477,0.32642296416127,-1.459343308476307,-0.7992955273550889,0.4700127959384029,-1.150180520382904,-0.2715967161573364,0.4574242198601326,-0.01695793567169252,-0.5415943604330673,0.8758134174562739,0.7408381548831572],[-0.1648123878749513,-0.7509642835472464,-1.253366291254112,-1.036236261086891,-0.02943856918294788,-0.2749437779431586,0.4854514697156954,0.9169820339257299,-0.9853439162645946,-1.49118974621714,0.8195924493300755,1.01340453316793,1.053605251243667,-0.07142863879664518,0.9524446066581037,-0.3840375188814126,-0.4177599918285912,-0.4702681712570727,-1.690180287194481,-0.9454976554580454,-0.3430119602929844,0.3584624080565848,0.04818886066246819,1.130172278250215,-0.5276323115795134,0.4795753251263228,1.417529297958747,-0.08009077262193659,-0.3941870030211085,0.5252576367540488,-0.7959350962245446,0.2450964484123524,-0.7793198352531773,0.5949238709436765,1.108890896416993,-0.9429690299132897,0.7003439889195451,-0.4246748252127485,-1.143137602694829,0.233440224092367,-0.1892365768374837,-1.66341125636827,1.915690769851676,-0.8168944359495347,0.3836504926939145,-0.45863225105032,-0.7157039776060217,0.4295485413107256,-1.169852744557196,1.322088308621181,1.365964636230403,-0.2497237099230604,-0.4247213495822969,1.098439335187043,0.6709230408668556,0.03095465563428614,2.368511961367508,2.585788113093646,1.212280954550787,-1.251196840860951,0.4002660421968137,0.9347076305183237,-0.4726698458952756,1.58301322112178,0.5977542203255402,0.4660845862526154,-0.7443675373426283,0.9590552584880708,0.1526370807093095,-0.7693686970890065,1.393080738536693,0.918668765596698,1.0160870641131,0.5346354389649385,-0.9876285601047141,1.187792273294136,-0.5175422120592618,-0.2595602505958536,-0.3280646712350382,0.07343239495574358,-0.2478630202060162,-1.373862256098897,-0.04044581831363935,0.4215382385430456,0.2015975056017167,-1.697191918162991,0.6422876828900983,-0.9952396132262208,0.9638138998830267,-1.656037230871793,1.070861091480068,-0.1090263600463561,1.899186392722483,-1.137030733156864,-0.2797197578581568,-0.8941290505145657,0.1367018463153619,-0.7491654182242808,0.5181990767190288,-0.1923372142776934,0.0288098118017779,0.3585908856542522,-0.02899503456363366,1.147042072108809,0.3735889351047901,0.3233392112620057,-0.8298193202578782,1.394462581630908,-0.1915435771199435,0.2722770208617893,-1.081659008331326,-2.329399361363491,-0.5496259585570886,-0.0725799910031537,1.032288403733848,0.2151385257755671,-0.4943401245609158,1.512138281237257,-0.5794632641967767,1.674789633932644,-1.000980258524317,1.222702835218574,1.077188166080205,-0.6119454595294147,0.5068669683158991,0.4600683731220483,1.484391861458237,0.8819632260015384,-0.536702239350799,1.285553706509819,0.5878485326010617,-1.308482025518096,0.3167263248660296,1.194158303479843,0.9130571477944758,-0.786752992705507,-0.4109296996639918,0.4763736818416209,0.1859158675343828,-1.324716252975642,1.172371055125703,0.2314927722196306,0.4830719040714007,-0.5353195801955016,1.378135818972899,-1.302671671133523,0.6348575352934486,0.999655161250627,-0.3377489528256253,-0.08603360695374181,-1.718817583541451,-0.9291215723686332,0.8136760464960741,0.5264135456514646,1.011957390306609,0.8313798093443211,0.4151341447442909,-0.6612570608614495,0.5488112862802258,-0.5393677996350521,-0.1713184263702447,-0.766734605198929,-0.6065748455734394,1.64731282099364,0.8410693480785594,0.3381750972076064,-0.4048830757878161,0.9000090391443738,1.190666655241071,-0.04753908348423741,0.7869254247733276,1.166684112027711,-0.2718238713074823,-0.3137042849541035,-0.2863001501725999,-0.8034402628479541,-0.09455545529700358,-0.07404650616222856,0.7144906833898889,0.1247183657796416,1.296594338574938,-1.114492926037875,-0.8420588125144853,-1.504294208616326,-0.2840264551541388,0.04286904062378677,-0.008866413309984113,-2.949083784243553,0.02035825417575629,-0.09844697973347524,0.5891090977773195,-0.4257516288164602,0.634658985040875,-0.5785249022565833,-0.1691090479499068,-1.919232520195261,-1.534266386749387,-1.114761220951407,1.597811635315441,-0.6398050777154926,1.566690552631183,-1.449155712077402,-0.7915039586793183,-0.5044807329516383,0.4018267000623483,0.9713964685044942,-0.5796630201036562,1.60417978930849,0.2259733369959407,-0.5148571224052696,-0.8237882396380964,0.3344152498049095,-0.09349076450912039,0.3040620777065443,-0.476507533940173,-0.2413117171135555,0.8241558332894772,-1.555643970107624,0.09350128252654108,-0.3669494208501755,-0.1294087988556329,0.4077955203576215,-0.5839689536605007,-0.1934498897529203,-0.2695466695119815,0.07365823227732218,0.3572361375113718,0.5504284181905409,0.03840179346679532,-1.609575292012264,-1.049710114737772,2.0520339736577,0.1764364108433968,1.128307358107953,0.4350017438552748,0.5488334919145959,0.6474183037667887,0.8784634543623231,0.3507978687500333,0.04987972017287776,0.8357494456177605,-0.2817251988510062,-0.7916794609883141,0.001653727262336547,-1.187530126465644,0.3624174650393404,-0.5494353187990336,0.6929498383017207,-0.06084391642852865,-1.193540929994318],{\"iconUrl\":{\"data\":[\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAABOFBMVEUAAAAA//9/f39VqqpAf78zmcxVf6pJkrY5jqpGi7lOibFEiLtLh7RDhq5Af7JGf7lHhbhJf7ZKhLVJg7ZDf7VEg7RJf7ZEgrVEgrZIgrJIgrNGhLRHgrRGhLVEgbNHg7REgbRGgbNFg7RGg7JFgbNGgbNGgrRFgbRGgrRGgbRGgrRFg7VHgrNGg7RGgrVGgrRGg7VFgrNGgrVGg7VGgbNGgrNHgrVGgbNGgrNGgbRFgrRHgbNHgrNGg7RGgrRHg7RGgrRGgrRHgrRGgrRHgrRGgrVHgrRGgrNGgbRGgbRFgrVHgrNGgrRFgrRGgrRGgrRGgrRGgrRGgrRGgrRFgrRGgrRGgrRGgrNHgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgbRGgrQoxujkAAAAaHRSTlMAAQIDBAUGBwkLDQ8RExQWGRwfIyYpKi0xNTk6PT5DREdNTlBRV1hZYmNqa2xtbnR1dnh/gIOJipGSk5SbnJ2mp7Cxsri5vL3BxcrO0tXW2drb3N3g4+bp6+zt7vDy9Pb4+fr7/P3+/8TEAfUAAAE4SURBVDiNY2AYBdQBwvJEACGgwsB0IkAgUKFRuikh80zTjYAK2QJ8WfA7jtknmB1Eq6Rr4Veona4MYbhG8eJTxxPhDmWJJVvgU2iZIg5jWieL41YnmmSFMDzSDbdCl2g+BEc3XRGXOqV0HSQei08QO3Z1bP5+rMh8uXQD7AoN0xVQBZxiBbCp449xRBMRTrDFptAuUQRdyDxVElOdRKoZhhhXmCcjhqBHODembs10NXQh9XQNLM5h8grlRBXhCPFmwqKQQSrNGFXAJE0GmzoGBod4IWSuYJw9dnXoMmj6UOxKl0VwpNFdggSQXY/pN2SghggPzXRV3OqQQhhr+CMBeJxhjVFkYAtJBcIJNvjVAdOVE4hyxp7qkIEBKKXKpesTUgdO+7hzBjJQStfVw53XkIFrVJQrpigAEpRA4e+Am0MAAAAASUVORK5CYII=\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAAKlBMVEUAAABVqqpAf79Hg7RGgrRGgrVGg7RGgrVHgbNGgbRFg7NGg7RFgrRGgrQeLgjrAAAADnRSTlMAAwRzdHh7fJSWoqSp/66qNFgAAACpSURBVDiNjdXZDgMhCAVQ7GA7S/n/3+2krVGBC/pITuICuRKZVfa92KrjLpFrQZZTnpu8HyuOKJc/l8vmMtldLEcXydlhqR2S1vnSc570nZXIaYndLCM3yth1mbkmc/eXh9TMEVU51uG99Stz3A6ZSO7XDiWPDxlInlsDJetmA8l2fFypHZLW+dJznvSdlchpid0sIzfK2HWZuSZz943wWtdCfDHs0ffxAdN1CQ17hm83AAAAAElFTkSuQmCC\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAAD1BMVEUAAABHgrRGgrRFgbRGgrQ7ZCpoAAAABXRSTlMAfru/7qRvvecAAAAySURBVDiNY2DABIyMWASxAWbmUYWjCoeNQkYmDMDCginGSLzCAfTMqMJRhQOjEGv1AQDUpAGBsJNc7gAAAABJRU5ErkJggg==\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAABDlBMVEUAAAAA//9/f39VqqpAf79Av78zmcxKf7VHhbhFf7FChLNJf7ZGhLBEf7JKhLVIf7dGg7JDf7RJg7ZHf7FJf7ZEgrVGgrRGg7VGgbNHgrNFgrVHgbNGgbRFgrVHgbNGgrRFg7VHgrNHg7RGgrRGg7VFgrNHg7RGgrNGgbRHgrRGgbVGgrNFgbRFg7ZHgrVGgbNFgbRGgrRGhLZGgrRGg7RGg7RGgrRHgrRGg7RGgrRGgrRHgrRGgrVGgrRGgrRGgbRGgrRHgbRGgrRGgbRGgrRFgbNFgbVGgrRFgrVGgbRGgrRGg7RFgrNHgrVGgbRFgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgbRGgrQa4aLEAAAAWnRSTlMAAQIDBAQFGBkaGxwdHh8gISIjJCotM0xNXmBhY2RlZmdoc3R1dneDhIWGh4iIiYqMj4+Zmpydn6C1t7i5urvBwsPExcbHx8jKy8zNzs7P0vT19vf4+/z9/v/aZ5NYAAABmklEQVQ4jd3U6V6CQBAA8DE6BLHUEo/MTC1TSaXS0k7tELVL1I15/xcJRXEW7AXcT8vs/8cyw+4ArN84WE4FUVFEYeUSQBQ1exI5fflFa7BOPmxHNIxSqc2kfMNMvZCOxdKFnskaAWeBjDJqvtTIUKVFQKoYxiGobjeVH9gM0IjcQt3rAHT82uIjwjsOvC6JXWt3LqRam6TdTh41hTIvre8T7oeSC94asp0RdVZKRp13+0y1M3LkPN8qC3PwzLQTduSiLpKZ4+Brdz6Zy2X9em3qBFYAKkmdixPy30HCIyDygtQ5g34CFYwBkXi5fIqj8h9UkVaJhyIeE6fRep7gDk1mck4cV88Slwx0dOqoHDxRB3lTom4pZTPLwQircM6RNRbiIDRGQeDP80zuja94BwGjJbjOvSW3H35EF4SE99yX8RNTbje9Ct+bfER4w77P41Qc4F2QRnYfvbfDziM5HFXlRUCujYcJKLulfc+lOjP7xUw8nin1TXYtgqcBOC0lnGtPpi1l8pwNLV7BtRTSiTb8iuLfWLm0NuMPVEVPYc1PKswAAAAASUVORK5CYII=\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAAHlBMVEUAAAAA//9Jf7ZEgrVGgrNFgbRFg7ZGgrRGhLZGgrQ9CRVYAAAACnRSTlMAASoth4iIj4//c7lcugAAAIJJREFUOI3d1N0OgCAIBWDLinj/F+5nzakH8Fw2uXN80w2QlOaLlUxlFc+J5vboSEhsKovhdrzAlIYzpekM6TiQrutk4BoZukoOXJFD90nCvfJg3CP1ZNz9rt13dOJMCDh3lsARstRlIKv6hbKpcyC7frgS+vazf8QuAH6lsEtqkrgAjVQEigFnHRgAAAAASUVORK5CYII=\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAAS1BMVEUAAAB/f39IgrJHhLNGhLRIg7NLhbRHg7RHhLVGgbNHgrJIg7JFg7VHg7RHhLNHg7RHgrRHgbRGgrRGgrRFgrRGgrRFg7NHg7RGgrQCPHREAAAAGXRSTlMAAjU2OkBBRFNXWmNnc3Z3gYTS1NXd4PT/O546hwAAANFJREFUOI3d1OsSgiAQhmHJJLVM7eTe/5Um4MICH/q7dmyGrXeesmaqqv+b80VM28rtJLuadqYWYUNDIGaiOWwDNVEYNvVcR8GX4q2jbr2OQ/V4KfM4DK0myFLoMEGWws0KZCFkKpCF0Ev+gMMA+RMOxd3yEYby++MzDOUvwgsKJeg3FEYgryCMQd5BmIDbE3mYghuZhxnoyCzMQUdmIQAtmYYagJbUSTgh0JBTEr4RaMhPEmLQkFGoaRnvcMaFtAj7vb+UXr7DDXtmrvgz/fR8AaEAGHnJp2rcAAAAAElFTkSuQmCC\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAANlBMVEUAAAAA//9Ig7NHhbRHg7RKgrVFhLRHgrVGgrNFgbRFg7ZGgrRGhLZGg7NFgbRGgrRFgrRGgrRkfGsyAAAAEnRSTlMAAUBBRFZZWoeIiI+Ppaarrf9+YQ6pAAAAs0lEQVQ4jd3USQ7DIAwFUEratCQd4vtftswY8x2xjneIJ2R/CRtzvXre1Xpwt9JJrQxaogO/dxDZDn5ov4GWHP0EtC8kHe1WQgOkd2aEowwOQSmjg7CXyWHIZXYKbLI4DRZZnQqTbE6HQW7NnUAv6a1c9SdHPCUd+v54niqMczCpwTxvkwqsuVSJIcuvSAiZqxLBzhUJoHBZjnBwSQ4QuCgXAb/IBSm/6+QCmF4p00vqIvUHa9QQ+5CCZJ4AAAAASUVORK5CYII=\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAABcVBMVEUAAAAA//9/f39VqqpAf78zmcxVf6pJkrZAf785jqpGi7lOibFEiLtLh7RHf7hDhq5Af7JGf7lHhbhJf7ZKhLVJg7ZDf7VEg7RJf7ZGf7RIf7FEgrZFhLVIgrJIgrNGhLRHgrRGhLVGg7ZEgbNHg7REgbRHg7VGg7VGgbNFg7RHgbVFgbNIg7RGgbNGgrRFgbRHgbNGgrRGgbRFgrVGg7RGgrRHgrNGg7RGgrVGgrRGg7VFgrNGgrVHgrRGg7VGgbNGgrNFgbRHgrVGgbNGgrRHgbVGgrNHgbNGgrRHgrNGg7RGgrRGgrNHg7RGgrRGg7VGgrRHgrRGgrRGgrRGgrVHgrRGgrNGgbRGgrRGgbRGgrRFgrVHgrNGg7VGgrRGg7RFgrRGgrRGgrRGgrRGgrRGgrRFgrRGgrRGgrRGgrRGgrNHgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgbRGgrSTYk+GAAAAe3RSTlMAAQIDBAUGBwgJCw0PERITFBYZHB8jJikqLC4xNDU5Oj0+QkNER0hMTU5PUVJXWFlhYmNkaWpsbW50dXZ4fn+Ag4iJiouQkZSVm5ydpaanqLCxsre5vL3BwsXGys7R0tPV1tna3N3g4+bo6evs7e7w8vT2+Pn6+/z9/v/BB7PWAAABUUlEQVQ4je2S51bCQBCFR5oFLIixYe8VuyiiYFesKPaGxIIlIqIQ5uklJ0QCm93wAN4/c+futzmTPQNAKCQIITIlNYSzbhzU5yyRsNl4+1CqCy5gL0AXevQ4e+xQKsHPWh1w57teKlwiwOac4rJsVsRWJnj+YpONNXpZwuDGcFyxE+iic+VP1wbFG66eK6igL92Ra9rSPhrniO+q272vOgp4kH/iiO9rc+3pxfxgCTu1OHJ69b+pNIWjhZELJ0nOGr0gX/js1UZka2ILeduZWi2MuMS2xjgQkHdEpSPtvbLHgvlBN85rcQAe7FO3pjva7lsi92ZVO4f92hzAALpzTdX7CY0DOP6o+fNbySY62PCzqdjG5DqdA9hINWddSKhmgZVvp7IZwWkWBzCDw1Kx8GETGzTePJZlihf9PTryozcD8liE+AzI6X1PEsce7l9F6xcGdk1VTEk5tgAAAABJRU5ErkJggg==\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAALVBMVEUAAABIgrJHhLNGhLRIg7NHg7RGg7ZHhLVHg7RGgrRFgbRGgrRGgrRGgrRGgrRShW4XAAAAD3RSTlMANTY6QERQU3O7v8zQ7v/aRe04AAAAV0lEQVQ4je2UOQ7AIBDECBBu5v/PpcykgKyoCMKdhbUSzSi1H+YmvGe7uNMYoCm0CHSjFJIA+wrZUuo+nXDV0CHHh1pJMtxM+Idfn/AjFA6AeFLEI7UJDdPEDV1c7JwyAAAAAElFTkSuQmCC\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAAPFBMVEUAAABVqqpAf79Hg7RGgrRGg7RGgrVFg7NGg7RFgrRGgrRFgbRHgbNFgbVGgbRHgrRGgbRGgrRGgrRGgrSIq6AnAAAAFHRSTlMAAwRzdHt8oqSpu7/Jytvc3d7u/yk3gSAAAADVSURBVDiNjdVZEsIgDABQqohVulnuf1db1iwEyGfmzQRIJijFYlqWiWcrbnZuHpDT2/1293kMuJe1z668nbJW9aR3N+zI4DxsyugCbMjkIhRldgkKsrgMqxK4AisSOgCZRA5CIrFDEEniMASSOgKzZI7CKLljMMjVbV8S50kzm1vH4VXa9ErrdEjThrpc27Sghg9pZKhxa4wENW22qUPNx8fUIHVYFsgdkhnWHJQJ1h2QEUquyABll6WHLZfkDdsuygv2XJDW9p1f4ccxtsQHl730ffwBkkAP1sgtFMQAAAAASUVORK5CYII=\"],\"index\":[0,0,0,1,0,2,3,4,5,5,3,6,3,7,7,2,0,8,1,5,0,3,4,4,2,3,9,0,8,4,0,4,0,4,7,1,3,2,5,3,8,1,9,5,8,0,0,3,5,4,9,0,2,6,3,2,9,9,9,5,3,3,0,9,7,4,0,4,8,0,6,4,3,3,5,6,1,0,8,4,8,1,8,4,2,1,3,1,3,1,6,8,9,5,0,1,8,1,3,0,2,3,0,3,2,3,1,6,2,8,0,5,1,2,3,8,8,6,0,9,1,4,3,0,4,3,9,3,2,9,3,5,4,9,6,5,0,4,4,0,6,2,4,8,7,5,3,3,2,0,1,0,3,2,3,6,7,0,3,0,8,1,0,6,3,7,2,3,6,2,3,7,8,0,2,0,2,2,4,2,6,5,5,5,0,2,0,5,2,8,2,8,4,1,8,5,5,5,4,0,9,5,1,0,4,4,8,9,4,0,0,3,2,3,0,2,6,5,2,1,8,4,2,8,2,2,3,3,8,1,1,6,3,4,2,6,3,6,2,2,4,8,2,8,0,2,0,3,2,1]},\"popupAnchorX\":20,\"popupAnchorY\":0},null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},[\"lat = -0.4202, long = -0.1648, group = 4, pch = 6\",\"lat = -0.2554, long = -0.7510, group = 4, pch = 6\",\"lat = -0.3692, long = -1.2534, group = 4, pch = 6\",\"lat = 1.2124, long = -1.0362, group = 9, pch = 5\",\"lat = -0.4454, long = -0.0294, group = 4, pch = 6\",\"lat = 1.1387, long = -0.2749, group = 2, pch = 3\",\"lat = 0.1905, long = 0.4855, group = 8, pch = 13\",\"lat = -1.3664, long = 0.9170, group = 1, pch = 4\",\"lat = -1.2981, long = -0.9853, group = 5, pch = 14\",\"lat = -2.1371, long = -1.4912, group = 5, pch = 14\",\"lat = -0.0962, long = 0.8196, group = 8, pch = 13\",\"lat = 0.6945, long = 1.0134, group = 3, pch = 7\",\"lat = -0.4746, long = 1.0536, group = 8, pch = 13\",\"lat = 1.7631, long = -0.0714, group = 7, pch = 2\",\"lat = 2.0258, long = 0.9524, group = 7, pch = 2\",\"lat = 0.4276, long = -0.3840, group = 2, pch = 3\",\"lat = -0.5665, long = -0.4178, group = 4, pch = 6\",\"lat = -0.8338, long = -0.4703, group = 10, pch = 12\",\"lat = 0.3983, long = -1.6902, group = 9, pch = 5\",\"lat = -1.4745, long = -0.9455, group = 5, pch = 14\",\"lat = -0.3954, long = -0.3430, group = 4, pch = 6\",\"lat = -0.1307, long = 0.3585, group = 8, pch = 13\",\"lat = -1.9995, long = 0.0482, group = 1, pch = 4\",\"lat = -0.9959, long = 1.1302, group = 1, pch = 4\",\"lat = 0.4201, long = -0.5276, group = 2, pch = 3\",\"lat = -0.0629, long = 0.4796, group = 8, pch = 13\",\"lat = -0.0801, long = 1.4175, group = 6, pch = 9\",\"lat = -0.0323, long = -0.0801, group = 4, pch = 6\",\"lat = -0.7190, long = -0.3942, group = 10, pch = 12\",\"lat = -1.1166, long = 0.5253, group = 1, pch = 4\",\"lat = -0.7803, long = -0.7959, group = 4, pch = 6\",\"lat = -1.7770, long = 0.2451, group = 1, pch = 4\",\"lat = -0.4278, long = -0.7793, group = 4, pch = 6\",\"lat = -2.0310, long = 0.5949, group = 1, pch = 4\",\"lat = 2.7508, long = 1.1089, group = 7, pch = 2\",\"lat = 1.5137, long = -0.9430, group = 9, pch = 5\",\"lat = 0.0340, long = 0.7003, group = 8, pch = 13\",\"lat = 0.7408, long = -0.4247, group = 2, pch = 3\",\"lat = -1.2708, long = -1.1431, group = 5, pch = 14\",\"lat = -0.1636, long = 0.2334, group = 8, pch = 13\",\"lat = -0.6109, long = -0.1892, group = 10, pch = 12\",\"lat = 1.2519, long = -1.6634, group = 9, pch = 5\",\"lat = 0.2503, long = 1.9157, group = 6, pch = 9\",\"lat = -1.7056, long = -0.8169, group = 5, pch = 14\",\"lat = -0.8554, long = 0.3837, group = 10, pch = 12\",\"lat = -0.1449, long = -0.4586, group = 4, pch = 6\",\"lat = -0.3244, long = -0.7157, group = 4, pch = 6\",\"lat = -0.1726, long = 0.4295, group = 8, pch = 13\",\"lat = -1.2361, long = -1.1699, group = 5, pch = 14\",\"lat = -1.9023, long = 1.3221, group = 1, pch = 4\",\"lat = -0.0945, long = 1.3660, group = 6, pch = 9\",\"lat = 0.0326, long = -0.2497, group = 4, pch = 6\",\"lat = 0.4613, long = -0.4247, group = 2, pch = 3\",\"lat = 1.3814, long = 1.0984, group = 3, pch = 7\",\"lat = -0.4165, long = 0.6709, group = 8, pch = 13\",\"lat = 0.6809, long = 0.0310, group = 2, pch = 3\",\"lat = -0.4144, long = 2.3685, group = 6, pch = 9\",\"lat = -0.5183, long = 2.5858, group = 6, pch = 9\",\"lat = -0.6840, long = 1.2123, group = 6, pch = 9\",\"lat = -0.8856, long = -1.2512, group = 5, pch = 14\",\"lat = 0.0492, long = 0.4003, group = 8, pch = 13\",\"lat = 0.1856, long = 0.9347, group = 8, pch = 13\",\"lat = -0.6087, long = -0.4727, group = 4, pch = 6\",\"lat = -0.7311, long = 1.5830, group = 6, pch = 9\",\"lat = 2.7151, long = 0.5978, group = 7, pch = 2\",\"lat = -1.3394, long = 0.4661, group = 1, pch = 4\",\"lat = -0.6460, long = -0.7444, group = 4, pch = 6\",\"lat = -0.9325, long = 0.9591, group = 1, pch = 4\",\"lat = -0.7691, long = 0.1526, group = 10, pch = 12\",\"lat = 0.3716, long = -0.7694, group = 4, pch = 6\",\"lat = 0.3554, long = 1.3931, group = 3, pch = 7\",\"lat = -0.9840, long = 0.9187, group = 1, pch = 4\",\"lat = 0.2147, long = 1.0161, group = 8, pch = 13\",\"lat = -0.0801, long = 0.5346, group = 8, pch = 13\",\"lat = -1.4224, long = -0.9876, group = 5, pch = 14\",\"lat = 1.1081, long = 1.1878, group = 3, pch = 7\",\"lat = 1.0785, long = -0.5175, group = 9, pch = 5\",\"lat = -0.4403, long = -0.2596, group = 4, pch = 6\",\"lat = -0.7782, long = -0.3281, group = 10, pch = 12\",\"lat = -1.8186, long = 0.0734, group = 1, pch = 4\",\"lat = -1.1241, long = -0.2479, group = 10, pch = 12\",\"lat = 1.0605, long = -1.3739, group = 9, pch = 5\",\"lat = -1.4787, long = -0.0404, group = 10, pch = 12\",\"lat = -1.5516, long = 0.4215, group = 1, pch = 4\",\"lat = 0.7775, long = 0.2016, group = 2, pch = 3\",\"lat = 1.0684, long = -1.6972, group = 9, pch = 5\",\"lat = -0.1836, long = 0.6423, group = 8, pch = 13\",\"lat = 1.5582, long = -0.9952, group = 9, pch = 5\",\"lat = -0.2132, long = 0.9638, group = 8, pch = 13\",\"lat = 0.9305, long = -1.6560, group = 9, pch = 5\",\"lat = 0.4108, long = 1.0709, group = 3, pch = 7\",\"lat = -1.2798, long = -0.1090, group = 10, pch = 12\",\"lat = -0.7824, long = 1.8992, group = 6, pch = 9\",\"lat = -2.2761, long = -1.1370, group = 5, pch = 14\",\"lat = -0.1264, long = -0.2797, group = 4, pch = 6\",\"lat = 1.4481, long = -0.8941, group = 9, pch = 5\",\"lat = -1.4428, long = 0.1367, group = 10, pch = 12\",\"lat = 1.4672, long = -0.7492, group = 9, pch = 5\",\"lat = -0.7433, long = 0.5182, group = 8, pch = 13\",\"lat = -0.3042, long = -0.1923, group = 4, pch = 6\",\"lat = 0.3377, long = 0.0288, group = 2, pch = 3\",\"lat = -0.6075, long = 0.3586, group = 8, pch = 13\",\"lat = -0.2956, long = -0.0290, group = 4, pch = 6\",\"lat = -0.1345, long = 1.1470, group = 8, pch = 13\",\"lat = 0.8148, long = 0.3736, group = 2, pch = 3\",\"lat = -0.2729, long = 0.3233, group = 8, pch = 13\",\"lat = 2.1595, long = -0.8298, group = 9, pch = 5\",\"lat = 1.0917, long = 1.3945, group = 3, pch = 7\",\"lat = 0.7434, long = -0.1915, group = 2, pch = 3\",\"lat = -1.2079, long = 0.2723, group = 10, pch = 12\",\"lat = 0.3278, long = -1.0817, group = 4, pch = 6\",\"lat = -0.5342, long = -2.3294, group = 5, pch = 14\",\"lat = 1.2839, long = -0.5496, group = 9, pch = 5\",\"lat = 0.0289, long = -0.0726, group = 2, pch = 3\",\"lat = -0.3957, long = 1.0323, group = 8, pch = 13\",\"lat = -0.6949, long = 0.2151, group = 10, pch = 12\",\"lat = -1.4921, long = -0.4943, group = 10, pch = 12\",\"lat = 1.4443, long = 1.5121, group = 3, pch = 7\",\"lat = -0.3470, long = -0.5795, group = 4, pch = 6\",\"lat = -0.0403, long = 1.6748, group = 6, pch = 9\",\"lat = 1.2466, long = -1.0010, group = 9, pch = 5\",\"lat = -1.3463, long = 1.2227, group = 1, pch = 4\",\"lat = -0.5739, long = 1.0772, group = 8, pch = 13\",\"lat = -0.7060, long = -0.6119, group = 4, pch = 6\",\"lat = -1.8574, long = 0.5069, group = 1, pch = 4\",\"lat = -0.2470, long = 0.4601, group = 8, pch = 13\",\"lat = -0.3356, long = 1.4844, group = 6, pch = 9\",\"lat = -0.2494, long = 0.8820, group = 8, pch = 13\",\"lat = 0.4595, long = -0.5367, group = 2, pch = 3\",\"lat = -0.4601, long = 1.2856, group = 6, pch = 9\",\"lat = 0.0589, long = 0.5878, group = 8, pch = 13\",\"lat = -0.7426, long = -1.3085, group = 5, pch = 14\",\"lat = -2.1636, long = 0.3167, group = 1, pch = 4\",\"lat = -0.2329, long = 1.1942, group = 6, pch = 9\",\"lat = 0.8749, long = 0.9131, group = 3, pch = 7\",\"lat = -0.9735, long = -0.7868, group = 5, pch = 14\",\"lat = -0.5127, long = -0.4109, group = 4, pch = 6\",\"lat = -0.9235, long = 0.4764, group = 1, pch = 4\",\"lat = -1.4944, long = 0.1859, group = 1, pch = 4\",\"lat = -0.1659, long = -1.3247, group = 4, pch = 6\",\"lat = 1.5822, long = 1.1724, group = 3, pch = 7\",\"lat = 1.0146, long = 0.2315, group = 2, pch = 3\",\"lat = -1.1465, long = 0.4831, group = 1, pch = 4\",\"lat = -0.9098, long = -0.5353, group = 10, pch = 12\",\"lat = 3.1092, long = 1.3781, group = 7, pch = 2\",\"lat = -1.0696, long = -1.3027, group = 5, pch = 14\",\"lat = -0.7001, long = 0.6349, group = 8, pch = 13\",\"lat = -0.1984, long = 0.9997, group = 8, pch = 13\",\"lat = 0.7436, long = -0.3377, group = 2, pch = 3\",\"lat = -0.0502, long = -0.0860, group = 4, pch = 6\",\"lat = 1.3131, long = -1.7188, group = 9, pch = 5\",\"lat = 0.0860, long = -0.9291, group = 4, pch = 6\",\"lat = -0.6299, long = 0.8137, group = 8, pch = 13\",\"lat = 0.6551, long = 0.5264, group = 2, pch = 3\",\"lat = 0.0194, long = 1.0120, group = 8, pch = 13\",\"lat = 0.6963, long = 0.8314, group = 3, pch = 7\",\"lat = 2.0089, long = 0.4151, group = 7, pch = 2\",\"lat = -0.0570, long = -0.6613, group = 4, pch = 6\",\"lat = 0.2404, long = 0.5488, group = 8, pch = 13\",\"lat = -0.0219, long = -0.5394, group = 4, pch = 6\",\"lat = -0.8308, long = -0.1713, group = 10, pch = 12\",\"lat = 1.4025, long = -0.7667, group = 9, pch = 5\",\"lat = -0.7239, long = -0.6066, group = 4, pch = 6\",\"lat = 1.3306, long = 1.6473, group = 3, pch = 7\",\"lat = -0.8113, long = 0.8411, group = 8, pch = 13\",\"lat = 1.7950, long = 0.3382, group = 7, pch = 2\",\"lat = 0.6866, long = -0.4049, group = 2, pch = 3\",\"lat = 0.0894, long = 0.9000, group = 8, pch = 13\",\"lat = 0.3245, long = 1.1907, group = 3, pch = 7\",\"lat = 0.0713, long = -0.0475, group = 2, pch = 3\",\"lat = 0.2330, long = 0.7869, group = 8, pch = 13\",\"lat = 1.9864, long = 1.1667, group = 7, pch = 2\",\"lat = -0.9517, long = -0.2718, group = 10, pch = 12\",\"lat = -0.5586, long = -0.3137, group = 4, pch = 6\",\"lat = 0.2558, long = -0.2863, group = 2, pch = 3\",\"lat = -0.1981, long = -0.8034, group = 4, pch = 6\",\"lat = 0.4288, long = -0.0946, group = 2, pch = 3\",\"lat = 0.0708, long = -0.0740, group = 2, pch = 3\",\"lat = -1.5367, long = 0.7145, group = 1, pch = 4\",\"lat = 0.4540, long = 0.1247, group = 2, pch = 3\",\"lat = 0.8744, long = 1.2966, group = 3, pch = 7\",\"lat = -1.2977, long = -1.1145, group = 5, pch = 14\",\"lat = -1.0790, long = -0.8421, group = 5, pch = 14\",\"lat = -1.1348, long = -1.5043, group = 5, pch = 14\",\"lat = 0.0226, long = -0.2840, group = 4, pch = 6\",\"lat = -0.0215, long = 0.0429, group = 2, pch = 3\",\"lat = -0.2788, long = -0.0089, group = 4, pch = 6\",\"lat = -0.0242, long = -2.9491, group = 5, pch = 14\",\"lat = 0.8250, long = 0.0204, group = 2, pch = 3\",\"lat = -0.7502, long = -0.0984, group = 10, pch = 12\",\"lat = 0.5362, long = 0.5891, group = 2, pch = 3\",\"lat = -1.5727, long = -0.4258, group = 10, pch = 12\",\"lat = -0.9864, long = 0.6347, group = 1, pch = 4\",\"lat = 1.9835, long = -0.5785, group = 9, pch = 5\",\"lat = -1.8514, long = -0.1691, group = 10, pch = 12\",\"lat = -0.9098, long = -1.9192, group = 5, pch = 14\",\"lat = -1.9514, long = -1.5343, group = 5, pch = 14\",\"lat = -0.8003, long = -1.1148, group = 5, pch = 14\",\"lat = -1.8694, long = 1.5978, group = 1, pch = 4\",\"lat = -0.7506, long = -0.6398, group = 4, pch = 6\",\"lat = -0.5909, long = 1.5667, group = 6, pch = 9\",\"lat = -0.7421, long = -1.4492, group = 5, pch = 14\",\"lat = 0.6935, long = -0.7915, group = 9, pch = 5\",\"lat = -0.0595, long = -0.5045, group = 4, pch = 6\",\"lat = -1.8639, long = 0.4018, group = 1, pch = 4\",\"lat = -1.2745, long = 0.9714, group = 1, pch = 4\",\"lat = -1.7818, long = -0.5797, group = 10, pch = 12\",\"lat = -0.5086, long = 1.6042, group = 6, pch = 9\",\"lat = -1.7369, long = 0.2260, group = 1, pch = 4\",\"lat = 0.0405, long = -0.5149, group = 4, pch = 6\",\"lat = -0.1242, long = -0.8238, group = 4, pch = 6\",\"lat = -0.6128, long = 0.3344, group = 8, pch = 13\",\"lat = 0.1607, long = -0.0935, group = 2, pch = 3\",\"lat = -0.6624, long = 0.3041, group = 8, pch = 13\",\"lat = -0.3349, long = -0.4765, group = 4, pch = 6\",\"lat = 0.6230, long = -0.2413, group = 2, pch = 3\",\"lat = 1.0282, long = 0.8242, group = 3, pch = 7\",\"lat = -1.1346, long = -1.5556, group = 5, pch = 14\",\"lat = 0.9169, long = 0.0935, group = 2, pch = 3\",\"lat = 1.2139, long = -0.3669, group = 9, pch = 5\",\"lat = -0.6859, long = -0.1294, group = 10, pch = 12\",\"lat = -1.0946, long = 0.4078, group = 1, pch = 4\",\"lat = 0.3649, long = -0.5840, group = 2, pch = 3\",\"lat = -1.0080, long = -0.1934, group = 10, pch = 12\",\"lat = 0.5550, long = -0.2695, group = 2, pch = 3\",\"lat = 0.4361, long = 0.0737, group = 2, pch = 3\",\"lat = 0.1054, long = 0.3572, group = 8, pch = 13\",\"lat = -0.2537, long = 0.5504, group = 8, pch = 13\",\"lat = -0.9765, long = 0.0384, group = 10, pch = 12\",\"lat = 0.3942, long = -1.6096, group = 9, pch = 5\",\"lat = 1.0149, long = -1.0497, group = 9, pch = 5\",\"lat = 0.6314, long = 2.0520, group = 3, pch = 7\",\"lat = -0.4834, long = 0.1764, group = 8, pch = 13\",\"lat = -1.5263, long = 1.1283, group = 1, pch = 4\",\"lat = 0.6168, long = 0.4350, group = 2, pch = 3\",\"lat = 1.2293, long = 0.5488, group = 3, pch = 7\",\"lat = 0.1575, long = 0.6474, group = 8, pch = 13\",\"lat = 1.4063, long = 0.8785, group = 3, pch = 7\",\"lat = 0.3968, long = 0.3508, group = 2, pch = 3\",\"lat = 0.3264, long = 0.0499, group = 2, pch = 3\",\"lat = -1.4593, long = 0.8357, group = 1, pch = 4\",\"lat = -0.7993, long = -0.2817, group = 10, pch = 12\",\"lat = 0.4700, long = -0.7917, group = 2, pch = 3\",\"lat = -1.1502, long = 0.0017, group = 10, pch = 12\",\"lat = -0.2716, long = -1.1875, group = 4, pch = 6\",\"lat = 0.4574, long = 0.3624, group = 2, pch = 3\",\"lat = -0.0170, long = -0.5494, group = 4, pch = 6\",\"lat = -0.5416, long = 0.6929, group = 8, pch = 13\",\"lat = 0.8758, long = -0.0608, group = 2, pch = 3\",\"lat = 0.7408, long = -1.1935, group = 9, pch = 5\"],null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[-2.276083449854667,3.109182684890497],\"lng\":[-2.949083784243553,2.585788113093646]}},\"evals\":[],\"jsHooks\":[]} unlink(iconFiles) # clean up the tmp png files that have been embedded # }"},{"path":"https://rstudio.github.io/leaflet/reference/leaflet-package.html","id":null,"dir":"Reference","previous_headings":"","what":"leaflet: Create Interactive Web Maps with the JavaScript 'Leaflet' Library — leaflet-package","title":"leaflet: Create Interactive Web Maps with the JavaScript 'Leaflet' Library — leaflet-package","text":"Create customize interactive maps using 'Leaflet' JavaScript library 'htmlwidgets' package. maps can used directly R console, 'RStudio', Shiny applications R Markdown documents.","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/leaflet-package.html","id":"author","dir":"Reference","previous_headings":"","what":"Author","title":"leaflet: Create Interactive Web Maps with the JavaScript 'Leaflet' Library — leaflet-package","text":"Maintainer: Joe Cheng joe@posit.co Authors: Barret Schloerke barret@posit.co (ORCID) Bhaskar Karambelkar Yihui Xie contributors: Hadley Wickham [contributor] Kenton Russell [contributor] Kent Johnson [contributor] Vladimir Agafonkin (Leaflet library) [contributor, copyright holder] CloudMade (Leaflet library) [copyright holder] Leaflet contributors (Leaflet library) [contributor] Brandon Copeland (leaflet-measure plugin) [contributor, copyright holder] Joerg Dietrich (Leaflet.Terminator plugin) [contributor, copyright holder] Benjamin Becquet (Leaflet.MagnifyingGlass plugin) [contributor, copyright holder] Norkart (Leaflet.MiniMap plugin) [contributor, copyright holder] L. Voogdt (Leaflet.awesome-markers plugin) [contributor, copyright holder] Daniel Montague (Leaflet.EasyButton plugin) [contributor, copyright holder] Kartena AB (Proj4Leaflet plugin) [contributor, copyright holder] Robert Kajic (leaflet-locationfilter plugin) [contributor, copyright holder] Mapbox (leaflet-omnivore plugin) [contributor, copyright holder] Michael Bostock (topojson) [contributor, copyright holder] Posit Software, PBC [copyright holder, funder]","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":null,"dir":"Reference","previous_headings":"","what":"Create a Leaflet map widget — leaflet","title":"Create a Leaflet map widget — leaflet","text":"function creates Leaflet map widget using htmlwidgets. widget can rendered HTML pages generated R Markdown, Shiny, applications.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Create a Leaflet map widget — leaflet","text":"","code":"leaflet( data = NULL, width = NULL, height = NULL, padding = 0, options = leafletOptions(), elementId = NULL, sizingPolicy = leafletSizingPolicy(padding = padding) ) leafletOptions( minZoom = NULL, maxZoom = NULL, crs = leafletCRS(), worldCopyJump = NULL, preferCanvas = NULL, ... ) leafletCRS( crsClass = \"L.CRS.EPSG3857\", code = NULL, proj4def = NULL, projectedBounds = NULL, origin = NULL, transformation = NULL, scales = NULL, resolutions = NULL, bounds = NULL, tileSize = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Create a Leaflet map widget — leaflet","text":"data data object. Currently supported objects matrix, data frame, spatial data sf package, SpatVector terra package, Spatial* objects sp package represent points, lines, polygons. width width map height height map padding padding map options map options elementId Use explicit element ID widget (rather automatically generated one). sizingPolicy htmlwidgets sizing policy object. Defaults leafletSizingPolicy() minZoom Minimum zoom level map. Overrides minZoom set map layers. maxZoom Maximum zoom level map. overrides maxZoom set map layers. crs Coordinate Reference System use. change sure means. worldCopyJump option enabled, map tracks pan another \"copy\" world seamlessly jumps original one overlays like markers vector layers still visible. preferCanvas Whether leaflet.js Paths rendered Canvas renderer. ... options used leaflet.js map creation. crsClass One L.CRS.EPSG3857, L.CRS.EPSG4326, L.CRS.EPSG3395, L.CRS.Simple, L.Proj.CRS code CRS identifier proj4def Proj4 string projectedBounds DEPRECATED! Use bounds argument. origin Origin projected coordinates, set overrides transformation option. transformation use transforming projected coordinates pixel coordinates scales Scale factors (pixels per projection unit, example pixels/meter) zoom levels; specify either scales resolutions, resolutions factors (projection units per pixel, example meters/pixel) zoom levels; specify either scales resolutions, bounds Bounds CRS, projected coordinates; defined, Proj4Leaflet use getSize method, otherwise defaulting Leaflet's default CRS size tileSize DEPRECATED! Specify tilesize tileOptions() argument.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Create a Leaflet map widget — leaflet","text":"HTML widget object, can add graphics layers using %>% (see examples).","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Create a Leaflet map widget — leaflet","text":"data argument needed going reference variables object later map layers. example, data can data frame containing columns latitude longtitude, may add circle layer map leaflet(data) %>% addCircles(lat = ~latitude, lng = ~longtitude), variables formulae evaluated data.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"functions","dir":"Reference","previous_headings":"","what":"Functions","title":"Create a Leaflet map widget — leaflet","text":"leafletOptions(): Options map creation leafletCRS(): class create custom CRS","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Create a Leaflet map widget — leaflet","text":"","code":"# !formatR library(leaflet) m <- leaflet() %>% addTiles() m # a map with the default OSM tile layer {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}]},\"evals\":[],\"jsHooks\":[]} # \\donttest{ # set bounds m %>% fitBounds(0, 40, 10, 50) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}],\"fitBounds\":[40,0,50,10,[]]},\"evals\":[],\"jsHooks\":[]} # move the center to Snedecor Hall m <- m %>% setView(-93.65, 42.0285, zoom = 17) m {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}],\"setView\":[[42.0285,-93.65000000000001],17,[]]},\"evals\":[],\"jsHooks\":[]} # popup m %>% addPopups(-93.65, 42.0285, \"Here is the Department of Statistics<\/b>, ISU\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addPopups\",\"args\":[42.0285,-93.65000000000001,\"Here is the Department of Statistics<\\/b>, ISU\",null,null,{\"maxWidth\":300,\"minWidth\":50,\"autoPan\":true,\"keepInView\":false,\"closeButton\":true,\"className\":\"\"}]}],\"setView\":[[42.0285,-93.65000000000001],17,[]],\"limits\":{\"lat\":[42.0285,42.0285],\"lng\":[-93.65000000000001,-93.65000000000001]}},\"evals\":[],\"jsHooks\":[]}rand_lng <- function(n = 10) rnorm(n, -93.65, .01) rand_lat <- function(n = 10) rnorm(n, 42.0285, .01) # use automatic bounds derived from lng/lat data m <- m %>% clearBounds() # popup m %>% addPopups(rand_lng(), rand_lat(), \"Random popups\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addPopups\",\"args\":[[42.03532633090344,42.03346913333052,42.04289660655913,42.04057358557952,42.03088514694102,42.02551162121993,42.04234621050239,42.02149930977988,42.04710931508507,42.04653924959101],[-93.65639033687326,-93.64601097062985,-93.63658026499833,-93.65037607421529,-93.64456329885854,-93.63259781605761,-93.6532445593915,-93.65447511333052,-93.64583917474124,-93.66295865367805],\"Random popups\",null,null,{\"maxWidth\":300,\"minWidth\":50,\"autoPan\":true,\"keepInView\":false,\"closeButton\":true,\"className\":\"\"}]}],\"limits\":{\"lat\":[42.02149930977988,42.04710931508507],\"lng\":[-93.66295865367805,-93.63259781605761]}},\"evals\":[],\"jsHooks\":[]} # marker m %>% addMarkers(rand_lng(), rand_lat()) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMarkers\",\"args\":[[42.04295014910009,42.02426518379451,42.02116250403391,42.02141515246801,42.04325092459101,42.03695004184792,42.04143994431286,42.03148161142113,42.02444317509959,42.02711192422018],[-93.66356043492232,-93.65314751071733,-93.66019265181163,-93.65612249655628,-93.65289068748586,-93.6349301670837,-93.64632277306379,-93.6502003494124,-93.65979921959125,-93.66400912332638],null,null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.02116250403391,42.04325092459101],\"lng\":[-93.66400912332638,-93.6349301670837]}},\"evals\":[],\"jsHooks\":[]}m %>% addMarkers( rand_lng(), rand_lat(), popup = paste(\"A random letter\", sample(LETTERS, 10)) ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMarkers\",\"args\":[[42.02023647829722,42.0289739913255,42.02556892627634,42.04057632181082,42.02882001383617,42.03030397549657,42.02927160579836,42.03408395337855,42.02683145632909,42.02622019380988],[-93.65222592731399,-93.63252849742631,-93.65081704668162,-93.64875858413929,-93.64607763858525,-93.64621580029898,-93.64833824326827,-93.6384661263063,-93.64985251697732,-93.64978559155014],null,null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},[\"A random letter K\",\"A random letter J\",\"A random letter U\",\"A random letter H\",\"A random letter G\",\"A random letter X\",\"A random letter A\",\"A random letter L\",\"A random letter F\",\"A random letter Y\"],null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.02023647829722,42.04057632181082],\"lng\":[-93.65222592731399,-93.63252849742631]}},\"evals\":[],\"jsHooks\":[]} Rlogo <- file.path(R.home(\"doc\"), \"html\", \"logo.jpg\") m %>% addMarkers( 174.7690922, -36.8523071, icon = list( iconUrl = Rlogo, iconSize = c(100, 76) ), popup = \"R was born here!\" ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMarkers\",\"args\":[-36.8523071,174.7690922,{\"iconUrl\":{\"data\":\"data:image/jpeg;base64,/9j/4QSfRXhpZgAATU0AKgAAAAgABwESAAMAAAABAAEAAAEaAAUAAAABAAAAYgEbAAUAAAABAAAAagEoAAMAAAABAAIAAAExAAIAAAAkAAAAcgEyAAIAAAAUAAAAlodpAAQAAAABAAAArAAAANgALcbAAAAnEAAtxsAAACcQQWRvYmUgUGhvdG9zaG9wIENDIDIwMTUgKE1hY2ludG9zaCkAMjAxNjowMjoxNSAwODowMjoxMgAAAAADoAEAAwAAAAEAAQAAoAIABAAAAAEAAABkoAMABAAAAAEAAABMAAAAAAAAAAYBAwADAAAAAQAGAAABGgAFAAAAAQAAASYBGwAFAAAAAQAAAS4BKAADAAAAAQACAAACAQAEAAAAAQAAATYCAgAEAAAAAQAAA2EAAAAAAAAASAAAAAEAAABIAAAAAf/Y/+0ADEFkb2JlX0NNAAH/7gAOQWRvYmUAZIAAAAAB/9sAhAAMCAgICQgMCQkMEQsKCxEVDwwMDxUYExMVExMYEQwMDAwMDBEMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMAQ0LCw0ODRAODhAUDg4OFBQODg4OFBEMDAwMDBERDAwMDAwMEQwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAz/wAARCAASABgDASIAAhEBAxEB/90ABAAC/8QBPwAAAQUBAQEBAQEAAAAAAAAAAwABAgQFBgcICQoLAQABBQEBAQEBAQAAAAAAAAABAAIDBAUGBwgJCgsQAAEEAQMCBAIFBwYIBQMMMwEAAhEDBCESMQVBUWETInGBMgYUkaGxQiMkFVLBYjM0coLRQwclklPw4fFjczUWorKDJkSTVGRFwqN0NhfSVeJl8rOEw9N14/NGJ5SkhbSVxNTk9KW1xdXl9VZmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9xEAAgIBAgQEAwQFBgcHBgU1AQACEQMhMRIEQVFhcSITBTKBkRShsUIjwVLR8DMkYuFygpJDUxVjczTxJQYWorKDByY1wtJEk1SjF2RFVTZ0ZeLys4TD03Xj80aUpIW0lcTU5PSltcXV5fVWZnaGlqa2xtbm9ic3R1dnd4eXp7fH/9oADAMBAAIRAxEAPwDurMzMz8o4+K706xOoMe0aeo9493u/casbqPWOk9Nz7cDKOfdk0bd76G17Tua20envs9X6L1r24uf0vMdlYlX2nHfIdW36QaTu2bfpe13825m9cf1DJzL/AK6W39Oc/Dynkek6ysvcwjHax7X47WZDve0Pb/NP/wBIrHLY4TlPj2jAz34fl/eYc85QEeHeUhHa93e6R9a8e3JNVF176me6yjMaBaGAhtt1F1TrGv8As877qLPf6X82ksb6qVM6l13IPUbHjqrt/rttDWgsBbXksYxgb+sbW+hY39GynH/mvUf/ADCUvsY/vHt0a4eLf08f9/8Azf8AXY/dn7PHYvirx4f7n+c/qv8A/9D1VcIP/wAqH5vP9r+hrxBJWeV/y3+xmwcx/k/9pF9mzf8A8pVf/hir+jfzn8z/AIT/AN3P+6aS8ZSVr9H/ANNmD9L/AKs//9n/7Q0QUGhvdG9zaG9wIDMuMAA4QklNBCUAAAAAABAAAAAAAAAAAAAAAAAAAAAAOEJJTQQ6AAAAAAFnAAAAEAAAAAEAAAAAAAtwcmludE91dHB1dAAAAAcAAAAAQ2xyU2VudW0AAAAAQ2xyUwAAAABSR0JDAAAAAE5tICBURVhUAAAAEwBDAGEAbQBlAHIAYQAgAFIARwBCACAAUAByAG8AZgBpAGwAZQAAAAAAAEludGVlbnVtAAAAAEludGUAAAAAQ2xybQAAAABNcEJsYm9vbAEAAAAPcHJpbnRTaXh0ZWVuQml0Ym9vbAAAAAALcHJpbnRlck5hbWVURVhUAAAAGQBPAGYAZgBpAGMAZQBqAGUAdAAgAFAAcgBvACAAOAA1ADAAMAAgAEEAOQAwADkAZwAAAAAAD3ByaW50UHJvb2ZTZXR1cE9iamMAAAAMAFAAcgBvAG8AZgAgAFMAZQB0AHUAcAAAAAAACnByb29mU2V0dXAAAAABAAAAAEJsdG5lbnVtAAAADGJ1aWx0aW5Qcm9vZgAAAAlwcm9vZkNNWUsAOEJJTQQ7AAAAAAItAAAAEAAAAAEAAAAAABJwcmludE91dHB1dE9wdGlvbnMAAAAXAAAAAENwdG5ib29sAAAAAABDbGJyYm9vbAAAAAAAUmdzTWJvb2wAAAAAAENybkNib29sAAAAAABDbnRDYm9vbAAAAAAATGJsc2Jvb2wAAAAAAE5ndHZib29sAAAAAABFbWxEYm9vbAAAAAAASW50cmJvb2wAAAAAAEJja2dPYmpjAAAAAQAAAAAAAFJHQkMAAAADAAAAAFJkICBkb3ViQG/gAAAAAAAAAAAAR3JuIGRvdWJAb+AAAAAAAAAAAABCbCAgZG91YkBv4AAAAAAAAAAAAEJyZFRVbnRGI1JsdAAAAAAAAAAAAAAAAEJsZCBVbnRGI1JsdAAAAAAAAAAAAAAAAFJzbHRVbnRGI1B4bEBywAAAAAAAAAAACnZlY3RvckRhdGFib29sAQAAAABQZ1BzZW51bQAAAABQZ1BzAAAAAFBnUEMAAAAATGVmdFVudEYjUmx0AAAAAAAAAAAAAAAAVG9wIFVudEYjUmx0AAAAAAAAAAAAAAAAU2NsIFVudEYjUHJjQFkAAAAAAAAAAAAQY3JvcFdoZW5QcmludGluZ2Jvb2wAAAAADmNyb3BSZWN0Qm90dG9tbG9uZwAAAAAAAAAMY3JvcFJlY3RMZWZ0bG9uZwAAAAAAAAANY3JvcFJlY3RSaWdodGxvbmcAAAAAAAAAC2Nyb3BSZWN0VG9wbG9uZwAAAAAAOEJJTQPtAAAAAAAQASwAAAABAAIBLAAAAAEAAjhCSU0EJgAAAAAADgAAAAAAAAAAAAA/gAAAOEJJTQQNAAAAAAAEAAAAHjhCSU0EGQAAAAAABAAAAB44QklNA/MAAAAAAAkAAAAAAAAAAAEAOEJJTScQAAAAAAAKAAEAAAAAAAAAAjhCSU0D9QAAAAAASAAvZmYAAQBsZmYABgAAAAAAAQAvZmYAAQChmZoABgAAAAAAAQAyAAAAAQBaAAAABgAAAAAAAQA1AAAAAQAtAAAABgAAAAAAAThCSU0D+AAAAAAAcAAA/////////////////////////////wPoAAAAAP////////////////////////////8D6AAAAAD/////////////////////////////A+gAAAAA/////////////////////////////wPoAAA4QklNBAAAAAAAAAIAADhCSU0EAgAAAAAAAgAAOEJJTQQwAAAAAAABAQA4QklNBC0AAAAAAAYAAQAAAAI4QklNBAgAAAAAABAAAAABAAACQAAAAkAAAAAAOEJJTQQeAAAAAAAEAAAAADhCSU0EGgAAAAADPwAAAAYAAAAAAAAAAAAAAEwAAABkAAAABQBSAGwAbwBnAG8AAAABAAAAAAAAAAAAAAAAAAAAAAAAAAEAAAAAAAAAAAAAAGQAAABMAAAAAAAAAAAAAAAAAAAAAAEAAAAAAAAAAAAAAAAAAAAAAAAAEAAAAAEAAAAAAABudWxsAAAAAgAAAAZib3VuZHNPYmpjAAAAAQAAAAAAAFJjdDEAAAAEAAAAAFRvcCBsb25nAAAAAAAAAABMZWZ0bG9uZwAAAAAAAAAAQnRvbWxvbmcAAABMAAAAAFJnaHRsb25nAAAAZAAAAAZzbGljZXNWbExzAAAAAU9iamMAAAABAAAAAAAFc2xpY2UAAAASAAAAB3NsaWNlSURsb25nAAAAAAAAAAdncm91cElEbG9uZwAAAAAAAAAGb3JpZ2luZW51bQAAAAxFU2xpY2VPcmlnaW4AAAANYXV0b0dlbmVyYXRlZAAAAABUeXBlZW51bQAAAApFU2xpY2VUeXBlAAAAAEltZyAAAAAGYm91bmRzT2JqYwAAAAEAAAAAAABSY3QxAAAABAAAAABUb3AgbG9uZwAAAAAAAAAATGVmdGxvbmcAAAAAAAAAAEJ0b21sb25nAAAATAAAAABSZ2h0bG9uZwAAAGQAAAADdXJsVEVYVAAAAAEAAAAAAABudWxsVEVYVAAAAAEAAAAAAABNc2dlVEVYVAAAAAEAAAAAAAZhbHRUYWdURVhUAAAAAQAAAAAADmNlbGxUZXh0SXNIVE1MYm9vbAEAAAAIY2VsbFRleHRURVhUAAAAAQAAAAAACWhvcnpBbGlnbmVudW0AAAAPRVNsaWNlSG9yekFsaWduAAAAB2RlZmF1bHQAAAAJdmVydEFsaWduZW51bQAAAA9FU2xpY2VWZXJ0QWxpZ24AAAAHZGVmYXVsdAAAAAtiZ0NvbG9yVHlwZWVudW0AAAARRVNsaWNlQkdDb2xvclR5cGUAAAAATm9uZQAAAAl0b3BPdXRzZXRsb25nAAAAAAAAAApsZWZ0T3V0c2V0bG9uZwAAAAAAAAAMYm90dG9tT3V0c2V0bG9uZwAAAAAAAAALcmlnaHRPdXRzZXRsb25nAAAAAAA4QklNBCgAAAAAAAwAAAACP/AAAAAAAAA4QklNBBQAAAAAAAQAAAACOEJJTQQMAAAAAAN9AAAAAQAAABgAAAASAAAASAAABRAAAANhABgAAf/Y/+0ADEFkb2JlX0NNAAH/7gAOQWRvYmUAZIAAAAAB/9sAhAAMCAgICQgMCQkMEQsKCxEVDwwMDxUYExMVExMYEQwMDAwMDBEMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMAQ0LCw0ODRAODhAUDg4OFBQODg4OFBEMDAwMDBERDAwMDAwMEQwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAz/wAARCAASABgDASIAAhEBAxEB/90ABAAC/8QBPwAAAQUBAQEBAQEAAAAAAAAAAwABAgQFBgcICQoLAQABBQEBAQEBAQAAAAAAAAABAAIDBAUGBwgJCgsQAAEEAQMCBAIFBwYIBQMMMwEAAhEDBCESMQVBUWETInGBMgYUkaGxQiMkFVLBYjM0coLRQwclklPw4fFjczUWorKDJkSTVGRFwqN0NhfSVeJl8rOEw9N14/NGJ5SkhbSVxNTk9KW1xdXl9VZmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9xEAAgIBAgQEAwQFBgcHBgU1AQACEQMhMRIEQVFhcSITBTKBkRShsUIjwVLR8DMkYuFygpJDUxVjczTxJQYWorKDByY1wtJEk1SjF2RFVTZ0ZeLys4TD03Xj80aUpIW0lcTU5PSltcXV5fVWZnaGlqa2xtbm9ic3R1dnd4eXp7fH/9oADAMBAAIRAxEAPwDurMzMz8o4+K706xOoMe0aeo9493u/casbqPWOk9Nz7cDKOfdk0bd76G17Tua20envs9X6L1r24uf0vMdlYlX2nHfIdW36QaTu2bfpe13825m9cf1DJzL/AK6W39Oc/Dynkek6ysvcwjHax7X47WZDve0Pb/NP/wBIrHLY4TlPj2jAz34fl/eYc85QEeHeUhHa93e6R9a8e3JNVF176me6yjMaBaGAhtt1F1TrGv8As877qLPf6X82ksb6qVM6l13IPUbHjqrt/rttDWgsBbXksYxgb+sbW+hY39GynH/mvUf/ADCUvsY/vHt0a4eLf08f9/8Azf8AXY/dn7PHYvirx4f7n+c/qv8A/9D1VcIP/wAqH5vP9r+hrxBJWeV/y3+xmwcx/k/9pF9mzf8A8pVf/hir+jfzn8z/AIT/AN3P+6aS8ZSVr9H/ANNmD9L/AKs//9kAOEJJTQQhAAAAAABdAAAAAQEAAAAPAEEAZABvAGIAZQAgAFAAaABvAHQAbwBzAGgAbwBwAAAAFwBBAGQAbwBiAGUAIABQAGgAbwB0AG8AcwBoAG8AcAAgAEMAQwAgADIAMAAxADUAAAABADhCSU0EBgAAAAAABwAGAAAAAQEA/+EOWmh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC8APD94cGFja2V0IGJlZ2luPSLvu78iIGlkPSJXNU0wTXBDZWhpSHpyZVN6TlRjemtjOWQiPz4gPHg6eG1wbWV0YSB4bWxuczp4PSJhZG9iZTpuczptZXRhLyIgeDp4bXB0az0iQWRvYmUgWE1QIENvcmUgNS42LWMxMTEgNzkuMTU4MzI1LCAyMDE1LzA5LzEwLTAxOjEwOjIwICAgICAgICAiPiA8cmRmOlJERiB4bWxuczpyZGY9Imh0dHA6Ly93d3cudzMub3JnLzE5OTkvMDIvMjItcmRmLXN5bnRheC1ucyMiPiA8cmRmOkRlc2NyaXB0aW9uIHJkZjphYm91dD0iIiB4bWxuczp4bXA9Imh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC8iIHhtbG5zOmRjPSJodHRwOi8vcHVybC5vcmcvZGMvZWxlbWVudHMvMS4xLyIgeG1sbnM6cGhvdG9zaG9wPSJodHRwOi8vbnMuYWRvYmUuY29tL3Bob3Rvc2hvcC8xLjAvIiB4bWxuczp4bXBNTT0iaHR0cDovL25zLmFkb2JlLmNvbS94YXAvMS4wL21tLyIgeG1sbnM6c3RFdnQ9Imh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC9zVHlwZS9SZXNvdXJjZUV2ZW50IyIgeG1wOkNyZWF0b3JUb29sPSJBZG9iZSBQaG90b3Nob3AgQ0MgMjAxNSAoTWFjaW50b3NoKSIgeG1wOkNyZWF0ZURhdGU9IjIwMTYtMDItMTNUMTA6MzY6MjBaIiB4bXA6TW9kaWZ5RGF0ZT0iMjAxNi0wMi0xNVQwODowMjoxMloiIHhtcDpNZXRhZGF0YURhdGU9IjIwMTYtMDItMTVUMDg6MDI6MTJaIiBkYzpmb3JtYXQ9ImltYWdlL2pwZWciIHBob3Rvc2hvcDpDb2xvck1vZGU9IjMiIHBob3Rvc2hvcDpJQ0NQcm9maWxlPSJzUkdCIElFQzYxOTY2LTIuMSIgeG1wTU06SW5zdGFuY2VJRD0ieG1wLmlpZDpiNGM3MjU2MS0zM2VhLTRmMDItOGI3ZC05M2M3ZWJhYWIwMmEiIHhtcE1NOkRvY3VtZW50SUQ9ImFkb2JlOmRvY2lkOnBob3Rvc2hvcDpjYjEyZGFiNC0xNDQ4LTExNzktYmY1NS1lZTVmNmFlZDg2NWQiIHhtcE1NOk9yaWdpbmFsRG9jdW1lbnRJRD0ieG1wLmRpZDozMDM3M2EyOC1jMmU4LTQxMDAtYWRiOC0yZTg0NTY1NGFlZWMiPiA8eG1wTU06SGlzdG9yeT4gPHJkZjpTZXE+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJjcmVhdGVkIiBzdEV2dDppbnN0YW5jZUlEPSJ4bXAuaWlkOjMwMzczYTI4LWMyZTgtNDEwMC1hZGI4LTJlODQ1NjU0YWVlYyIgc3RFdnQ6d2hlbj0iMjAxNi0wMi0xM1QxMDozNjoyMFoiIHN0RXZ0OnNvZnR3YXJlQWdlbnQ9IkFkb2JlIFBob3Rvc2hvcCBDQyAyMDIyIChNYWNpbnRvc2gpIi8+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJjb252ZXJ0ZWQiIHN0RXZ0OnBhcmFtZXRlcnM9ImZyb20gYXBwbGljYXRpb24vdm5kLmFkb2JlLnBob3Rvc2hvcCB0byBpbWFnZS9qcGVnIi8+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJzYXZlZCIgc3RFdnQ6aW5zdGFuY2VJRD0ieG1wLmlpZDpiNGM3MjU2MS0zM2VhLTRmMDItOGI3ZC05M2M3ZWJhYWIwMmEiIHN0RXZ0OndoZW49IjIwMTYtMDItMTVUMDg6MDI6MTJaIiBzdEV2dDpzb2Z0d2FyZUFnZW50PSJBZG9iZSBQaG90b3Nob3AgQ0MgMjAyMiAoTWFjaW50b3NoKSIgc3RFdnQ6Y2hhbmdlZD0iLyIvPiA8L3JkZjpTZXE+IDwveG1wTU06SGlzdG9yeT4gPC9yZGY6RGVzY3JpcHRpb24+IDwvcmRmOlJERj4gPC94OnhtcG1ldGE+ICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgPD94cGFja2V0IGVuZD0idyI/Pv/iDFhJQ0NfUFJPRklMRQABAQAADEhMaW5vAhAAAG1udHJSR0IgWFlaIAfOAAIACQAGADEAAGFjc3BNU0ZUAAAAAElFQyBzUkdCAAAAAAAAAAAAAAABAAD21gABAAAAANMtSFAgIAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAEWNwcnQAAAFQAAAAM2Rlc2MAAAGEAAAAbHd0cHQAAAHwAAAAFGJrcHQAAAIEAAAAFHJYWVoAAAIYAAAAFGdYWVoAAAIsAAAAFGJYWVoAAAJAAAAAFGRtbmQAAAJUAAAAcGRtZGQAAALEAAAAiHZ1ZWQAAANMAAAAhnZpZXcAAAPUAAAAJGx1bWkAAAP4AAAAFG1lYXMAAAQMAAAAJHRlY2gAAAQwAAAADHJUUkMAAAQ8AAAIDGdUUkMAAAQ8AAAIDGJUUkMAAAQ8AAAIDHRleHQAAAAAQ29weXJpZ2h0IChjKSAxOTk4IEhld2xldHQtUGFja2FyZCBDb21wYW55AABkZXNjAAAAAAAAABJzUkdCIElFQzYxOTY2LTIuMQAAAAAAAAAAAAAAEnNSR0IgSUVDNjE5NjYtMi4xAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAABYWVogAAAAAAAA81EAAQAAAAEWzFhZWiAAAAAAAAAAAAAAAAAAAAAAWFlaIAAAAAAAAG+iAAA49QAAA5BYWVogAAAAAAAAYpkAALeFAAAY2lhZWiAAAAAAAAAkoAAAD4QAALbPZGVzYwAAAAAAAAAWSUVDIGh0dHA6Ly93d3cuaWVjLmNoAAAAAAAAAAAAAAAWSUVDIGh0dHA6Ly93d3cuaWVjLmNoAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAGRlc2MAAAAAAAAALklFQyA2MTk2Ni0yLjEgRGVmYXVsdCBSR0IgY29sb3VyIHNwYWNlIC0gc1JHQgAAAAAAAAAAAAAALklFQyA2MTk2Ni0yLjEgRGVmYXVsdCBSR0IgY29sb3VyIHNwYWNlIC0gc1JHQgAAAAAAAAAAAAAAAAAAAAAAAAAAAABkZXNjAAAAAAAAACxSZWZlcmVuY2UgVmlld2luZyBDb25kaXRpb24gaW4gSUVDNjE5NjYtMi4xAAAAAAAAAAAAAAAsUmVmZXJlbmNlIFZpZXdpbmcgQ29uZGl0aW9uIGluIElFQzYxOTY2LTIuMQAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAdmlldwAAAAAAE6T+ABRfLgAQzxQAA+3MAAQTCwADXJ4AAAABWFlaIAAAAAAATAlWAFAAAABXH+dtZWFzAAAAAAAAAAEAAAAAAAAAAAAAAAAAAAAAAAACjwAAAAJzaWcgAAAAAENSVCBjdXJ2AAAAAAAABAAAAAAFAAoADwAUABkAHgAjACgALQAyADcAOwBAAEUASgBPAFQAWQBeAGMAaABtAHIAdwB8AIEAhgCLAJAAlQCaAJ8ApACpAK4AsgC3ALwAwQDGAMsA0ADVANsA4ADlAOsA8AD2APsBAQEHAQ0BEwEZAR8BJQErATIBOAE+AUUBTAFSAVkBYAFnAW4BdQF8AYMBiwGSAZoBoQGpAbEBuQHBAckB0QHZAeEB6QHyAfoCAwIMAhQCHQImAi8COAJBAksCVAJdAmcCcQJ6AoQCjgKYAqICrAK2AsECywLVAuAC6wL1AwADCwMWAyEDLQM4A0MDTwNaA2YDcgN+A4oDlgOiA64DugPHA9MD4APsA/kEBgQTBCAELQQ7BEgEVQRjBHEEfgSMBJoEqAS2BMQE0wThBPAE/gUNBRwFKwU6BUkFWAVnBXcFhgWWBaYFtQXFBdUF5QX2BgYGFgYnBjcGSAZZBmoGewaMBp0GrwbABtEG4wb1BwcHGQcrBz0HTwdhB3QHhgeZB6wHvwfSB+UH+AgLCB8IMghGCFoIbgiCCJYIqgi+CNII5wj7CRAJJQk6CU8JZAl5CY8JpAm6Cc8J5Qn7ChEKJwo9ClQKagqBCpgKrgrFCtwK8wsLCyILOQtRC2kLgAuYC7ALyAvhC/kMEgwqDEMMXAx1DI4MpwzADNkM8w0NDSYNQA1aDXQNjg2pDcMN3g34DhMOLg5JDmQOfw6bDrYO0g7uDwkPJQ9BD14Peg+WD7MPzw/sEAkQJhBDEGEQfhCbELkQ1xD1ERMRMRFPEW0RjBGqEckR6BIHEiYSRRJkEoQSoxLDEuMTAxMjE0MTYxODE6QTxRPlFAYUJxRJFGoUixStFM4U8BUSFTQVVhV4FZsVvRXgFgMWJhZJFmwWjxayFtYW+hcdF0EXZReJF64X0hf3GBsYQBhlGIoYrxjVGPoZIBlFGWsZkRm3Gd0aBBoqGlEadxqeGsUa7BsUGzsbYxuKG7Ib2hwCHCocUhx7HKMczBz1HR4dRx1wHZkdwx3sHhYeQB5qHpQevh7pHxMfPh9pH5Qfvx/qIBUgQSBsIJggxCDwIRwhSCF1IaEhziH7IiciVSKCIq8i3SMKIzgjZiOUI8Ij8CQfJE0kfCSrJNolCSU4JWgllyXHJfcmJyZXJocmtyboJxgnSSd6J6sn3CgNKD8ocSiiKNQpBik4KWspnSnQKgIqNSpoKpsqzysCKzYraSudK9EsBSw5LG4soizXLQwtQS12Last4S4WLkwugi63Lu4vJC9aL5Evxy/+MDUwbDCkMNsxEjFKMYIxujHyMioyYzKbMtQzDTNGM38zuDPxNCs0ZTSeNNg1EzVNNYc1wjX9Njc2cjauNuk3JDdgN5w31zgUOFA4jDjIOQU5Qjl/Obw5+To2OnQ6sjrvOy07azuqO+g8JzxlPKQ84z0iPWE9oT3gPiA+YD6gPuA/IT9hP6I/4kAjQGRApkDnQSlBakGsQe5CMEJyQrVC90M6Q31DwEQDREdEikTORRJFVUWaRd5GIkZnRqtG8Ec1R3tHwEgFSEtIkUjXSR1JY0mpSfBKN0p9SsRLDEtTS5pL4kwqTHJMuk0CTUpNk03cTiVObk63TwBPSU+TT91QJ1BxULtRBlFQUZtR5lIxUnxSx1MTU19TqlP2VEJUj1TbVShVdVXCVg9WXFapVvdXRFeSV+BYL1h9WMtZGllpWbhaB1pWWqZa9VtFW5Vb5Vw1XIZc1l0nXXhdyV4aXmxevV8PX2Ffs2AFYFdgqmD8YU9homH1YklinGLwY0Njl2PrZEBklGTpZT1lkmXnZj1mkmboZz1nk2fpaD9olmjsaUNpmmnxakhqn2r3a09rp2v/bFdsr20IbWBtuW4SbmtuxG8eb3hv0XArcIZw4HE6cZVx8HJLcqZzAXNdc7h0FHRwdMx1KHWFdeF2Pnabdvh3VnezeBF4bnjMeSp5iXnnekZ6pXsEe2N7wnwhfIF84X1BfaF+AX5ifsJ/I3+Ef+WAR4CogQqBa4HNgjCCkoL0g1eDuoQdhICE44VHhauGDoZyhteHO4efiASIaYjOiTOJmYn+imSKyoswi5aL/IxjjMqNMY2Yjf+OZo7OjzaPnpAGkG6Q1pE/kaiSEZJ6kuOTTZO2lCCUipT0lV+VyZY0lp+XCpd1l+CYTJi4mSSZkJn8mmia1ZtCm6+cHJyJnPedZJ3SnkCerp8dn4uf+qBpoNihR6G2oiailqMGo3aj5qRWpMelOKWpphqmi6b9p26n4KhSqMSpN6mpqhyqj6sCq3Wr6axcrNCtRK24ri2uoa8Wr4uwALB1sOqxYLHWskuywrM4s660JbSctRO1irYBtnm28Ldot+C4WbjRuUq5wro7urW7LrunvCG8m70VvY++Cr6Evv+/er/1wHDA7MFnwePCX8Lbw1jD1MRRxM7FS8XIxkbGw8dBx7/IPci8yTrJuco4yrfLNsu2zDXMtc01zbXONs62zzfPuNA50LrRPNG+0j/SwdNE08bUSdTL1U7V0dZV1tjXXNfg2GTY6Nls2fHadtr724DcBdyK3RDdlt4c3qLfKd+v4DbgveFE4cziU+Lb42Pj6+Rz5PzlhOYN5pbnH+ep6DLovOlG6dDqW+rl63Dr++yG7RHtnO4o7rTvQO/M8Fjw5fFy8f/yjPMZ86f0NPTC9VD13vZt9vv3ivgZ+Kj5OPnH+lf65/t3/Af8mP0p/br+S/7c/23////uAA5BZG9iZQBkQAAAAAH/2wCEAAICAgICAgICAgIDAgICAwQDAgIDBAUEBAQEBAUGBQUFBQUFBgYHBwgHBwYJCQoKCQkMDAwMDAwMDAwMDAwMDAwBAwMDBQQFCQYGCQ0KCQoNDw4ODg4PDwwMDAwMDw8MDAwMDAwPDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDP/AABEIAEwAZAMBEQACEQEDEQH/3QAEAA3/xAGiAAAABwEBAQEBAAAAAAAAAAAEBQMCBgEABwgJCgsBAAICAwEBAQEBAAAAAAAAAAEAAgMEBQYHCAkKCxAAAgEDAwIEAgYHAwQCBgJzAQIDEQQABSESMUFRBhNhInGBFDKRoQcVsUIjwVLR4TMWYvAkcoLxJUM0U5KismNzwjVEJ5OjszYXVGR0w9LiCCaDCQoYGYSURUaktFbTVSga8uPzxNTk9GV1hZWltcXV5fVmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9zhIWGh4iJiouMjY6PgpOUlZaXmJmam5ydnp+So6SlpqeoqaqrrK2ur6EQACAgECAwUFBAUGBAgDA20BAAIRAwQhEjFBBVETYSIGcYGRMqGx8BTB0eEjQhVSYnLxMyQ0Q4IWklMlomOywgdz0jXiRIMXVJMICQoYGSY2RRonZHRVN/Kjs8MoKdPj84SUpLTE1OT0ZXWFlaW1xdXl9UZWZnaGlqa2xtbm9kdXZ3eHl6e3x9fn9zhIWGh4iJiouMjY6Pg5SVlpeYmZqbnJ2en5KjpKWmp6ipqqusra6vr/2gAMAwEAAhEDEQA/APv5irsVY9rvmrQfLkfLVb9IZSKx2i/HM3hRFqaHxNB74QLRbxvWfzsmJePQtJSNP2bm9Ysx/wCecZAH/BHJcKOJ5xqH5mec74ktrktsh6R2yrCB8igDfecPCEWxG58x65cEmfWr6YnqXuJG/W2GlS463qqGqandIfFZnB/XhpUZbee/N9gf9F8y6igG4Rrh5F/4Fyw/DBQW2ZaX+e/nLTyq3/1TWoR9r14hFJT2eHgK/NTg4Qm3sHlv89vKOsNHb6sJPLl49BW4IktiT2EygU+bqo98iYlNvaIZobmKO4t5UngmUPDNGwZHU7gqwqCD7ZFKrirsVf/Q+/hNNzsB1OKvBvPH5rGJ5tK8ryqSlUudYoGFe4gB2/2R/wBj2OTEWJL5/ubua4lknuJnnmlYtLNIxZmY9SzGpJyTFL3l98UoN5KnbcnphVken+R/OWsKr2Hl28eJ/sTSp6CMPEPKUU/fgsLTJYvyS8+zir29la1/ZluVJ/5Jh8HEE06X8iPPdCVk0x/8kXD1/GMY8QWmP3/5M/mNaKXXRFvFXqbe5hY/QpdWP0DDxBaeaazoeu6E/p6zo95pbE0U3MLxq3+qzAA/QcIKp35L/M3zJ5FuVbTbo3OmM/K70W4JaCQH7RUf7rY/zL7VqNsTG1fdXkjz1ofn3SRqejy8ZYqJqOnSEetbSEfZcDqDT4WGx+YIFRFMmZ4Ff//R+xv5t+cpNPiXy1p0vC4u4+eqTKd1hb7MYPi/U+3zyUQxJfNTy++TYoR5ffCr0fyR+WOr+bgl/dOdK0Ina7ZayT06iFDTbtyO3hyoRkTKmQD6a8veRvLHlhEOmaXH9aQCuozgS3BPj6jD4a+C0HtkCbTT5S86/wDOcv5f+R/N3mTyfqHlDzDd3vlnUbjTbq6t/qnpSPbuUZk5zK1CRtUZ2Wj9itTqcMM0ckAJgHe+vweZ1PtTgwZZYzCRMSR06fFi3/RRD8sv+pI8z/dZf9lGZH+gHVf6pD7f1NH+jDT/AMyX2frWn/n4n+WQ/wCmH8z/APTl/wBlGP8AoB1X+qQ+39S/6MNP/Ml9n61p/wCfiv5Yj/ph/M//AE5f9lGP+gLVf6pD7f1L/ow0/wDMl9n61a3/AOfhP5Oai5sdZ8neZrawuBwmkkt7K5jof9+R/WQSPkD8srn7CayIuM4E+8j9DOHtdpiaMZD5frZbb6J+TH57aZea1+Svmixi120T1bzy+vO3pU0/fWcyrLACfhV0X0yeleuc5ruzNVoJVngY3yPMH3EbfDm73R9oafWC8UgfLqPhzeL+XfMvmP8AK3zf9YMEtnf6bMbbWdJl+ETRVHqRP1BBG6sKitGFcwiLDmP0X/xdof8AhP8Axp9a/wBwP1D9I+vQcvS48uPGv26/Dxr9rbKa3pk//9L6HeadWfVvMGsag7cvrN3IU9kVuKD6FAGWgMGLvL74VZ3+WnlRPN/mRILtSdK05PrOpDpzAICRV/yz19gcEjSQH2xHHHDHHFFGsUUShIokAVVVRQAAbAAZUyX4q/nk/wCcgz/yHD82R/39Wqf9RD5732F/iGD+pH7nyDtf/HMv9c/e8aY/dm1dcpMcVUSfvwJUif7cCp35Y81+YPJWv6Z5o8rarPouuaRMJrG/t24srDqrDoysKqysCrAkMCDlGp02PUYzjyASieYP4+1twZ54JicDUh1frJ5217T/AM3/AMofIH556faR2WqX6/orzbaQ/ZS5iLxt13ossbBSdyjp4Z4d2poDoNVPAdwDse8HcfjvfW+zdYNZp45ep5+8c0g/x3d/8qS/wh6x/wCUi4dT/vH6X1n0/wDkf8Wa+t3Of//T94azFJY6rqdlKCstndTQyKexRyp/VlwYJG8vvir6T/5x4lgZPNcdR9Z5WbHxKUmH4HITZB9K5BLsVfzv/wDOQh/5Dj+bP/gVap/1EPnvXYX+IYP6kfufIO1/8cy/1z97xonNs65+0f8Azhd5L8na3+QXl2/1nyno2r30mo6mr3l7YW88pC3TgAvIjMaAUG+eQ+12szY+0ZxhOQFR2BI6PpPs3psU9FEygCbPMA9X1Bf/AJS/lbqdnc2F9+XPlq4tLtDHPEdKtBUEU2ZYwVI7EEEHcb5zcO1NXCQlHLMEf0j+t3k9Bp5CjjjR8g/nv/Nzy9o3lH8z/P8A5X8uzGbQtA16+sdLYv6hWGCZkVC/7RSnEnuRnuPZmonn0uPJk+qUQT7yHybX4YYdRkhD6YyIHzebs39mZziP1E/Iv1If+cKvMbXdQtz5vc6Zy7qJbMHj9KSfjnkftoQe0RX8wfpfSvZQH8kb/nH9CWfoW7/5Vn/ib0m+p/4l+oepQ05fVPUr8u1fHOWvd6R//9T6h/nj5Um0vWV8zWsROnayQt2yjaK6UUNf+Miio9+WWRLEh8/vLkkMx/Lvzu3knzNbanIGk024X6tq0K7kwOQSyj+ZCAw8enfARaQ+/bC/s9Us7bUNPuY7yyvIxJbXMZqrqehBypki8Vfzt/8AOQp/5Dl+bX/gVap/1EPnvXYX+IYP6kfufIO1/wDHMv8AXP3vGGb782rr3uPkb/nJb86Py18uWvlPyX5wGj6BZyzTW9l9QsJ+LzuXkPqT28jmrGu7bds0ut9n9DrMpy5ocUj1uQ5e4u00vbOr02MY8c6iPIH7wnup/wDOYn/OR2qWNzp8/wCZVzbwXSGOWWzsrC0nAO3wTwWySxn3RgffMfH7K9mwkJDELHeZEfImj8W2ftDrpijkO/cAPtAt8ySyvK7yyu0kkjFndiSzMdyST1JzfjbYOmJtlfkLyF5q/MzzRp3lDydpcmq61qT0VFBEcEQIDzzyUIjjStWY/LqQDia3W4tHiOXKaiPt8h3lyNLpcmpyDHjFk/iz5P1U/MTSrHyT5P8Ay2/5xt8jsdZvtC9KTXXgA5XGpXHJqEDoZJJnkIJ+EFN9s8R1+tlrdRPPL+I7eQ5AfAPreh0kdJgjij/CPmev2vqn/lTll/ypr/lWfqR/XfqnrfpCh4/pPl63q168fU+Hx4bZruLe3Mf/1fvVq+k6frum3ek6pbrdWN6hjnib7wQeoIO4I6HFXwr+Y35aa15FuZLgI+oeXpXpZ6sg+xU7RzgfYbtXo3beoFolbGnkjy++SQzzyN+avmPyDPwsZBf6PK/K60W4J9Jj3aNhvGxHcbH9oGgwGNpt9c+U/wA8vIfmdYoZ9RHl7UnoGsdSIjUsf5J/7thXYVIJ/lysxIZB+Gv/ADkFNHL+eH5syROJI381aoUdTUEG4ehB7g9s947C/wAQwf1I/c+Qdrf45l/rn73jZObR172Xyf8A847/AJ0fmB5etPNfk/yLc635fv3mS01GK5tEDtbuY5AElnRxRlI3Xftmo1fbui0uQ4suQRkK2o9fg7LT9karUQGTHAmJ62OnxeP6tpmpaHqV9pGs2Fxpeq6bM9tqGm3UbRTQSxmjJIjgFSD1BGbLHkjkiJQIIO4I5EOvnCUJGMhRHMJ35K1XybpOtJc+efKt35v0Qrxk0yy1E6ZKGqPjEwhmrQfs0Ff5h1yjV4804VhmIS7yOL7LDdpp4oTvLEyj3A8P6C/ULyN+en5cReVofKf/ADiz+Xb6FrGqenBrDS24k1KGdlJUPVp5LlgCSsskjIoB2O9PIPaHT67FnA1suK94n+Ejrw8q8xQL6d2Hl0eXCTpY8NfUP4genF3+Rsh9Qfkp+SUnkmSXzh5wnGq+e9TDu7s/rLZCapkAkJPqTPU+pJXxVSRVm5+Ur5O5fR2QV//W+/mKqU8ENzDLb3MKXFvOpSaCRQ6OrChVlNQQR1BxV86edP8AnHbRdXaa+8p3n+H7x6sdOlDSWbMf5SKvFU+HIdgoyYminzF5m/Kn8wfLLSNfeXbm6tY6/wCn2A+tQlR+0TFVkH+uFyYkCinl0jsjlHBVlNGVhQgjqCMkr4T88OW86+biTUnVrip/2We59h/8Z+n/AOFxfIu1/wDHc39csUZvuzZOvfef5Gfm7+YPlb8q9B0LQPMUmm6ZbXN+0NukFuxBluXdvjeJnPxMe+eO+18Qe1Mnuj/uQ+oezH/GfD3y+8vLPz70nzV589b8z54LvWr/AEuKK182alHBVRarRIJ5TEgUGMkISf2Svhm59iu1vDmdHkO0vVDyl/FH3S5jzvvdX7WdmcUBqoDcbT8x0l8OR8vc+Tyc9HeDe7/842/nPP8Akf8AmlpPmqTlJ5d1Bf0V5wtlXmz6dM6s7oOvOFlWRabnjx6Mc0vb3ZY7R0px/wAQ3j/W/UeR+fR2nY/aB0OoE/4TtL3fs5/2v6JLG9tNSsrPUdPuY7yw1CCO5sruJg0csMqh43RhsQykEHPEJwMJGMhRGxfWYyEgCNwUVkWT/9f7+Yq7FXYq7FUk1Py15d1qv6Y0HTtVJ6m7topj97qTjav53vz7s7TTfzr/ADWsbGBLWztvNOpxwW8YoqItw4VVHYACgz3jsM/4Bg/qR+58g7X/AMcy/wBc/e8hJzauvft1/wA4S+SvKGofkB5Q1jUPLOmahqst5qvPULq1inl+G/mVaPIrEUCgCmeM+2B/1zye6P8AuQ+oezP+IQHnL7y+x9W8vaLreg6l5Z1LTobjQtXtJrG/03gFie3nQpInEUAqCemc5hzSxTE4GpRNg+Yd5lxxyQMJCwRRfzg/nV+WGp/k9+ZHmTyHqReWLTJ/U0e/cAfW7Cb47afbarIQGA6OGXtnuvZXaMdfpo5o9RuO6XUfjo+Q9o6KWjzyxHpy8x0P46vJ2bNg4L9g/wDn35+e/wDiDQbn8l/Ml7y1jyzE935MllPxT6byrLagk7tbs3JR/vs0G0eeY+2fZHhZBqsY9MtpeUuh+P3+97/2W7T8SH5eZ3jvH3d3w+73P0szhHsH/9D7+Yq7FXYq7FXYq/nv/P3/AAf/AMrv/Nn6/wDpn6z/AIq1P1Pq/wBX9Ovrtypy3pyrT2z3DsXxvyOHh4a4I9/c+T9q+F+by3f1Hu73j5/wH/2v/wDp1zZf4R/R+1wP3P8AS+x+4P8AzhP9Q/6F28n/AKN+sfVPreren9a4+rX9IT1rw2655D7W8X8oz4quo8v6ofSvZyvyMOHlZ+8vq/Obd6/Lb/n4z/yrj6z+W/6X+t/444XX/HP9P1P0RXb1/U2p69fS/wCeuehew/5msvDXh7c/53l8OfweK9rfAvHxXx78v5vn8eXxfmIf8Bf9r/8A6dc739//AEfteN/c/wBL7Ho/5O0/5Wl5F/5Vh/iD/Hn6Xt/8P1+q+nz5fvfW7el6XP1K7cOVdq5gdqf4rk/McPh8Jvn9nnfLzczs/wDxiHg8XHe3L8VXPyf0e54e+tv/2Q==\",\"index\":0},\"iconSize\":[[100,76]]},null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},\"R was born here!\",null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[-36.8523071,-36.8523071],\"lng\":[174.7690922,174.7690922]}},\"evals\":[],\"jsHooks\":[]} m %>% addMarkers(rnorm(30, 175), rnorm(30, -37), icon = list( iconUrl = Rlogo, iconSize = c(25, 19) )) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMarkers\",\"args\":[[-36.74945600428287,-36.70394268991016,-37.50949153490204,-36.79886181470058,-36.99355626131839,-36.6449689590053,-38.39145202244976,-35.72534686878304,-38.38680873499319,-37.60308870781991,-36.66178564452072,-37.08653430701014,-36.17933032809054,-37.07878626566091,-36.97303456430403,-37.57033852742706,-37.26814491982226,-36.25793368742815,-37.25679287615806,-37.92042995804882,-39.04560029769151,-38.16583954173786,-37.83815111322449,-36.28514379899016,-37.51255226612866,-38.10189728576249,-36.46849609454593,-38.88506365342354,-37.98878234758308,-37.20284603388136],[174.8880968120105,173.6018114631305,174.588478791854,174.8570693374731,175.7949059599894,174.4250595600296,174.7061070767284,174.7093418859,175.2316128688731,174.9327946028437,176.2440048132401,174.7060736532758,174.9260285457816,175.7995256412215,174.2294663942398,175.2454727686159,173.4338079809993,174.1773032230816,174.3554916853149,174.7014262904863,173.962634650142,175.1248026372745,175.8114435546814,177.2567496719338,174.3866052762217,174.9282763834137,174.1866713548035,175.0376734823736,176.1858477317601,175.3344291894759],{\"iconUrl\":{\"data\":\"data:image/jpeg;base64,/9j/4QSfRXhpZgAATU0AKgAAAAgABwESAAMAAAABAAEAAAEaAAUAAAABAAAAYgEbAAUAAAABAAAAagEoAAMAAAABAAIAAAExAAIAAAAkAAAAcgEyAAIAAAAUAAAAlodpAAQAAAABAAAArAAAANgALcbAAAAnEAAtxsAAACcQQWRvYmUgUGhvdG9zaG9wIENDIDIwMTUgKE1hY2ludG9zaCkAMjAxNjowMjoxNSAwODowMjoxMgAAAAADoAEAAwAAAAEAAQAAoAIABAAAAAEAAABkoAMABAAAAAEAAABMAAAAAAAAAAYBAwADAAAAAQAGAAABGgAFAAAAAQAAASYBGwAFAAAAAQAAAS4BKAADAAAAAQACAAACAQAEAAAAAQAAATYCAgAEAAAAAQAAA2EAAAAAAAAASAAAAAEAAABIAAAAAf/Y/+0ADEFkb2JlX0NNAAH/7gAOQWRvYmUAZIAAAAAB/9sAhAAMCAgICQgMCQkMEQsKCxEVDwwMDxUYExMVExMYEQwMDAwMDBEMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMAQ0LCw0ODRAODhAUDg4OFBQODg4OFBEMDAwMDBERDAwMDAwMEQwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAz/wAARCAASABgDASIAAhEBAxEB/90ABAAC/8QBPwAAAQUBAQEBAQEAAAAAAAAAAwABAgQFBgcICQoLAQABBQEBAQEBAQAAAAAAAAABAAIDBAUGBwgJCgsQAAEEAQMCBAIFBwYIBQMMMwEAAhEDBCESMQVBUWETInGBMgYUkaGxQiMkFVLBYjM0coLRQwclklPw4fFjczUWorKDJkSTVGRFwqN0NhfSVeJl8rOEw9N14/NGJ5SkhbSVxNTk9KW1xdXl9VZmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9xEAAgIBAgQEAwQFBgcHBgU1AQACEQMhMRIEQVFhcSITBTKBkRShsUIjwVLR8DMkYuFygpJDUxVjczTxJQYWorKDByY1wtJEk1SjF2RFVTZ0ZeLys4TD03Xj80aUpIW0lcTU5PSltcXV5fVWZnaGlqa2xtbm9ic3R1dnd4eXp7fH/9oADAMBAAIRAxEAPwDurMzMz8o4+K706xOoMe0aeo9493u/casbqPWOk9Nz7cDKOfdk0bd76G17Tua20envs9X6L1r24uf0vMdlYlX2nHfIdW36QaTu2bfpe13825m9cf1DJzL/AK6W39Oc/Dynkek6ysvcwjHax7X47WZDve0Pb/NP/wBIrHLY4TlPj2jAz34fl/eYc85QEeHeUhHa93e6R9a8e3JNVF176me6yjMaBaGAhtt1F1TrGv8As877qLPf6X82ksb6qVM6l13IPUbHjqrt/rttDWgsBbXksYxgb+sbW+hY39GynH/mvUf/ADCUvsY/vHt0a4eLf08f9/8Azf8AXY/dn7PHYvirx4f7n+c/qv8A/9D1VcIP/wAqH5vP9r+hrxBJWeV/y3+xmwcx/k/9pF9mzf8A8pVf/hir+jfzn8z/AIT/AN3P+6aS8ZSVr9H/ANNmD9L/AKs//9n/7Q0QUGhvdG9zaG9wIDMuMAA4QklNBCUAAAAAABAAAAAAAAAAAAAAAAAAAAAAOEJJTQQ6AAAAAAFnAAAAEAAAAAEAAAAAAAtwcmludE91dHB1dAAAAAcAAAAAQ2xyU2VudW0AAAAAQ2xyUwAAAABSR0JDAAAAAE5tICBURVhUAAAAEwBDAGEAbQBlAHIAYQAgAFIARwBCACAAUAByAG8AZgBpAGwAZQAAAAAAAEludGVlbnVtAAAAAEludGUAAAAAQ2xybQAAAABNcEJsYm9vbAEAAAAPcHJpbnRTaXh0ZWVuQml0Ym9vbAAAAAALcHJpbnRlck5hbWVURVhUAAAAGQBPAGYAZgBpAGMAZQBqAGUAdAAgAFAAcgBvACAAOAA1ADAAMAAgAEEAOQAwADkAZwAAAAAAD3ByaW50UHJvb2ZTZXR1cE9iamMAAAAMAFAAcgBvAG8AZgAgAFMAZQB0AHUAcAAAAAAACnByb29mU2V0dXAAAAABAAAAAEJsdG5lbnVtAAAADGJ1aWx0aW5Qcm9vZgAAAAlwcm9vZkNNWUsAOEJJTQQ7AAAAAAItAAAAEAAAAAEAAAAAABJwcmludE91dHB1dE9wdGlvbnMAAAAXAAAAAENwdG5ib29sAAAAAABDbGJyYm9vbAAAAAAAUmdzTWJvb2wAAAAAAENybkNib29sAAAAAABDbnRDYm9vbAAAAAAATGJsc2Jvb2wAAAAAAE5ndHZib29sAAAAAABFbWxEYm9vbAAAAAAASW50cmJvb2wAAAAAAEJja2dPYmpjAAAAAQAAAAAAAFJHQkMAAAADAAAAAFJkICBkb3ViQG/gAAAAAAAAAAAAR3JuIGRvdWJAb+AAAAAAAAAAAABCbCAgZG91YkBv4AAAAAAAAAAAAEJyZFRVbnRGI1JsdAAAAAAAAAAAAAAAAEJsZCBVbnRGI1JsdAAAAAAAAAAAAAAAAFJzbHRVbnRGI1B4bEBywAAAAAAAAAAACnZlY3RvckRhdGFib29sAQAAAABQZ1BzZW51bQAAAABQZ1BzAAAAAFBnUEMAAAAATGVmdFVudEYjUmx0AAAAAAAAAAAAAAAAVG9wIFVudEYjUmx0AAAAAAAAAAAAAAAAU2NsIFVudEYjUHJjQFkAAAAAAAAAAAAQY3JvcFdoZW5QcmludGluZ2Jvb2wAAAAADmNyb3BSZWN0Qm90dG9tbG9uZwAAAAAAAAAMY3JvcFJlY3RMZWZ0bG9uZwAAAAAAAAANY3JvcFJlY3RSaWdodGxvbmcAAAAAAAAAC2Nyb3BSZWN0VG9wbG9uZwAAAAAAOEJJTQPtAAAAAAAQASwAAAABAAIBLAAAAAEAAjhCSU0EJgAAAAAADgAAAAAAAAAAAAA/gAAAOEJJTQQNAAAAAAAEAAAAHjhCSU0EGQAAAAAABAAAAB44QklNA/MAAAAAAAkAAAAAAAAAAAEAOEJJTScQAAAAAAAKAAEAAAAAAAAAAjhCSU0D9QAAAAAASAAvZmYAAQBsZmYABgAAAAAAAQAvZmYAAQChmZoABgAAAAAAAQAyAAAAAQBaAAAABgAAAAAAAQA1AAAAAQAtAAAABgAAAAAAAThCSU0D+AAAAAAAcAAA/////////////////////////////wPoAAAAAP////////////////////////////8D6AAAAAD/////////////////////////////A+gAAAAA/////////////////////////////wPoAAA4QklNBAAAAAAAAAIAADhCSU0EAgAAAAAAAgAAOEJJTQQwAAAAAAABAQA4QklNBC0AAAAAAAYAAQAAAAI4QklNBAgAAAAAABAAAAABAAACQAAAAkAAAAAAOEJJTQQeAAAAAAAEAAAAADhCSU0EGgAAAAADPwAAAAYAAAAAAAAAAAAAAEwAAABkAAAABQBSAGwAbwBnAG8AAAABAAAAAAAAAAAAAAAAAAAAAAAAAAEAAAAAAAAAAAAAAGQAAABMAAAAAAAAAAAAAAAAAAAAAAEAAAAAAAAAAAAAAAAAAAAAAAAAEAAAAAEAAAAAAABudWxsAAAAAgAAAAZib3VuZHNPYmpjAAAAAQAAAAAAAFJjdDEAAAAEAAAAAFRvcCBsb25nAAAAAAAAAABMZWZ0bG9uZwAAAAAAAAAAQnRvbWxvbmcAAABMAAAAAFJnaHRsb25nAAAAZAAAAAZzbGljZXNWbExzAAAAAU9iamMAAAABAAAAAAAFc2xpY2UAAAASAAAAB3NsaWNlSURsb25nAAAAAAAAAAdncm91cElEbG9uZwAAAAAAAAAGb3JpZ2luZW51bQAAAAxFU2xpY2VPcmlnaW4AAAANYXV0b0dlbmVyYXRlZAAAAABUeXBlZW51bQAAAApFU2xpY2VUeXBlAAAAAEltZyAAAAAGYm91bmRzT2JqYwAAAAEAAAAAAABSY3QxAAAABAAAAABUb3AgbG9uZwAAAAAAAAAATGVmdGxvbmcAAAAAAAAAAEJ0b21sb25nAAAATAAAAABSZ2h0bG9uZwAAAGQAAAADdXJsVEVYVAAAAAEAAAAAAABudWxsVEVYVAAAAAEAAAAAAABNc2dlVEVYVAAAAAEAAAAAAAZhbHRUYWdURVhUAAAAAQAAAAAADmNlbGxUZXh0SXNIVE1MYm9vbAEAAAAIY2VsbFRleHRURVhUAAAAAQAAAAAACWhvcnpBbGlnbmVudW0AAAAPRVNsaWNlSG9yekFsaWduAAAAB2RlZmF1bHQAAAAJdmVydEFsaWduZW51bQAAAA9FU2xpY2VWZXJ0QWxpZ24AAAAHZGVmYXVsdAAAAAtiZ0NvbG9yVHlwZWVudW0AAAARRVNsaWNlQkdDb2xvclR5cGUAAAAATm9uZQAAAAl0b3BPdXRzZXRsb25nAAAAAAAAAApsZWZ0T3V0c2V0bG9uZwAAAAAAAAAMYm90dG9tT3V0c2V0bG9uZwAAAAAAAAALcmlnaHRPdXRzZXRsb25nAAAAAAA4QklNBCgAAAAAAAwAAAACP/AAAAAAAAA4QklNBBQAAAAAAAQAAAACOEJJTQQMAAAAAAN9AAAAAQAAABgAAAASAAAASAAABRAAAANhABgAAf/Y/+0ADEFkb2JlX0NNAAH/7gAOQWRvYmUAZIAAAAAB/9sAhAAMCAgICQgMCQkMEQsKCxEVDwwMDxUYExMVExMYEQwMDAwMDBEMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMAQ0LCw0ODRAODhAUDg4OFBQODg4OFBEMDAwMDBERDAwMDAwMEQwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAz/wAARCAASABgDASIAAhEBAxEB/90ABAAC/8QBPwAAAQUBAQEBAQEAAAAAAAAAAwABAgQFBgcICQoLAQABBQEBAQEBAQAAAAAAAAABAAIDBAUGBwgJCgsQAAEEAQMCBAIFBwYIBQMMMwEAAhEDBCESMQVBUWETInGBMgYUkaGxQiMkFVLBYjM0coLRQwclklPw4fFjczUWorKDJkSTVGRFwqN0NhfSVeJl8rOEw9N14/NGJ5SkhbSVxNTk9KW1xdXl9VZmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9xEAAgIBAgQEAwQFBgcHBgU1AQACEQMhMRIEQVFhcSITBTKBkRShsUIjwVLR8DMkYuFygpJDUxVjczTxJQYWorKDByY1wtJEk1SjF2RFVTZ0ZeLys4TD03Xj80aUpIW0lcTU5PSltcXV5fVWZnaGlqa2xtbm9ic3R1dnd4eXp7fH/9oADAMBAAIRAxEAPwDurMzMz8o4+K706xOoMe0aeo9493u/casbqPWOk9Nz7cDKOfdk0bd76G17Tua20envs9X6L1r24uf0vMdlYlX2nHfIdW36QaTu2bfpe13825m9cf1DJzL/AK6W39Oc/Dynkek6ysvcwjHax7X47WZDve0Pb/NP/wBIrHLY4TlPj2jAz34fl/eYc85QEeHeUhHa93e6R9a8e3JNVF176me6yjMaBaGAhtt1F1TrGv8As877qLPf6X82ksb6qVM6l13IPUbHjqrt/rttDWgsBbXksYxgb+sbW+hY39GynH/mvUf/ADCUvsY/vHt0a4eLf08f9/8Azf8AXY/dn7PHYvirx4f7n+c/qv8A/9D1VcIP/wAqH5vP9r+hrxBJWeV/y3+xmwcx/k/9pF9mzf8A8pVf/hir+jfzn8z/AIT/AN3P+6aS8ZSVr9H/ANNmD9L/AKs//9kAOEJJTQQhAAAAAABdAAAAAQEAAAAPAEEAZABvAGIAZQAgAFAAaABvAHQAbwBzAGgAbwBwAAAAFwBBAGQAbwBiAGUAIABQAGgAbwB0AG8AcwBoAG8AcAAgAEMAQwAgADIAMAAxADUAAAABADhCSU0EBgAAAAAABwAGAAAAAQEA/+EOWmh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC8APD94cGFja2V0IGJlZ2luPSLvu78iIGlkPSJXNU0wTXBDZWhpSHpyZVN6TlRjemtjOWQiPz4gPHg6eG1wbWV0YSB4bWxuczp4PSJhZG9iZTpuczptZXRhLyIgeDp4bXB0az0iQWRvYmUgWE1QIENvcmUgNS42LWMxMTEgNzkuMTU4MzI1LCAyMDE1LzA5LzEwLTAxOjEwOjIwICAgICAgICAiPiA8cmRmOlJERiB4bWxuczpyZGY9Imh0dHA6Ly93d3cudzMub3JnLzE5OTkvMDIvMjItcmRmLXN5bnRheC1ucyMiPiA8cmRmOkRlc2NyaXB0aW9uIHJkZjphYm91dD0iIiB4bWxuczp4bXA9Imh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC8iIHhtbG5zOmRjPSJodHRwOi8vcHVybC5vcmcvZGMvZWxlbWVudHMvMS4xLyIgeG1sbnM6cGhvdG9zaG9wPSJodHRwOi8vbnMuYWRvYmUuY29tL3Bob3Rvc2hvcC8xLjAvIiB4bWxuczp4bXBNTT0iaHR0cDovL25zLmFkb2JlLmNvbS94YXAvMS4wL21tLyIgeG1sbnM6c3RFdnQ9Imh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC9zVHlwZS9SZXNvdXJjZUV2ZW50IyIgeG1wOkNyZWF0b3JUb29sPSJBZG9iZSBQaG90b3Nob3AgQ0MgMjAxNSAoTWFjaW50b3NoKSIgeG1wOkNyZWF0ZURhdGU9IjIwMTYtMDItMTNUMTA6MzY6MjBaIiB4bXA6TW9kaWZ5RGF0ZT0iMjAxNi0wMi0xNVQwODowMjoxMloiIHhtcDpNZXRhZGF0YURhdGU9IjIwMTYtMDItMTVUMDg6MDI6MTJaIiBkYzpmb3JtYXQ9ImltYWdlL2pwZWciIHBob3Rvc2hvcDpDb2xvck1vZGU9IjMiIHBob3Rvc2hvcDpJQ0NQcm9maWxlPSJzUkdCIElFQzYxOTY2LTIuMSIgeG1wTU06SW5zdGFuY2VJRD0ieG1wLmlpZDpiNGM3MjU2MS0zM2VhLTRmMDItOGI3ZC05M2M3ZWJhYWIwMmEiIHhtcE1NOkRvY3VtZW50SUQ9ImFkb2JlOmRvY2lkOnBob3Rvc2hvcDpjYjEyZGFiNC0xNDQ4LTExNzktYmY1NS1lZTVmNmFlZDg2NWQiIHhtcE1NOk9yaWdpbmFsRG9jdW1lbnRJRD0ieG1wLmRpZDozMDM3M2EyOC1jMmU4LTQxMDAtYWRiOC0yZTg0NTY1NGFlZWMiPiA8eG1wTU06SGlzdG9yeT4gPHJkZjpTZXE+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJjcmVhdGVkIiBzdEV2dDppbnN0YW5jZUlEPSJ4bXAuaWlkOjMwMzczYTI4LWMyZTgtNDEwMC1hZGI4LTJlODQ1NjU0YWVlYyIgc3RFdnQ6d2hlbj0iMjAxNi0wMi0xM1QxMDozNjoyMFoiIHN0RXZ0OnNvZnR3YXJlQWdlbnQ9IkFkb2JlIFBob3Rvc2hvcCBDQyAyMDIyIChNYWNpbnRvc2gpIi8+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJjb252ZXJ0ZWQiIHN0RXZ0OnBhcmFtZXRlcnM9ImZyb20gYXBwbGljYXRpb24vdm5kLmFkb2JlLnBob3Rvc2hvcCB0byBpbWFnZS9qcGVnIi8+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJzYXZlZCIgc3RFdnQ6aW5zdGFuY2VJRD0ieG1wLmlpZDpiNGM3MjU2MS0zM2VhLTRmMDItOGI3ZC05M2M3ZWJhYWIwMmEiIHN0RXZ0OndoZW49IjIwMTYtMDItMTVUMDg6MDI6MTJaIiBzdEV2dDpzb2Z0d2FyZUFnZW50PSJBZG9iZSBQaG90b3Nob3AgQ0MgMjAyMiAoTWFjaW50b3NoKSIgc3RFdnQ6Y2hhbmdlZD0iLyIvPiA8L3JkZjpTZXE+IDwveG1wTU06SGlzdG9yeT4gPC9yZGY6RGVzY3JpcHRpb24+IDwvcmRmOlJERj4gPC94OnhtcG1ldGE+ICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgPD94cGFja2V0IGVuZD0idyI/Pv/iDFhJQ0NfUFJPRklMRQABAQAADEhMaW5vAhAAAG1udHJSR0IgWFlaIAfOAAIACQAGADEAAGFjc3BNU0ZUAAAAAElFQyBzUkdCAAAAAAAAAAAAAAABAAD21gABAAAAANMtSFAgIAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAEWNwcnQAAAFQAAAAM2Rlc2MAAAGEAAAAbHd0cHQAAAHwAAAAFGJrcHQAAAIEAAAAFHJYWVoAAAIYAAAAFGdYWVoAAAIsAAAAFGJYWVoAAAJAAAAAFGRtbmQAAAJUAAAAcGRtZGQAAALEAAAAiHZ1ZWQAAANMAAAAhnZpZXcAAAPUAAAAJGx1bWkAAAP4AAAAFG1lYXMAAAQMAAAAJHRlY2gAAAQwAAAADHJUUkMAAAQ8AAAIDGdUUkMAAAQ8AAAIDGJUUkMAAAQ8AAAIDHRleHQAAAAAQ29weXJpZ2h0IChjKSAxOTk4IEhld2xldHQtUGFja2FyZCBDb21wYW55AABkZXNjAAAAAAAAABJzUkdCIElFQzYxOTY2LTIuMQAAAAAAAAAAAAAAEnNSR0IgSUVDNjE5NjYtMi4xAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAABYWVogAAAAAAAA81EAAQAAAAEWzFhZWiAAAAAAAAAAAAAAAAAAAAAAWFlaIAAAAAAAAG+iAAA49QAAA5BYWVogAAAAAAAAYpkAALeFAAAY2lhZWiAAAAAAAAAkoAAAD4QAALbPZGVzYwAAAAAAAAAWSUVDIGh0dHA6Ly93d3cuaWVjLmNoAAAAAAAAAAAAAAAWSUVDIGh0dHA6Ly93d3cuaWVjLmNoAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAGRlc2MAAAAAAAAALklFQyA2MTk2Ni0yLjEgRGVmYXVsdCBSR0IgY29sb3VyIHNwYWNlIC0gc1JHQgAAAAAAAAAAAAAALklFQyA2MTk2Ni0yLjEgRGVmYXVsdCBSR0IgY29sb3VyIHNwYWNlIC0gc1JHQgAAAAAAAAAAAAAAAAAAAAAAAAAAAABkZXNjAAAAAAAAACxSZWZlcmVuY2UgVmlld2luZyBDb25kaXRpb24gaW4gSUVDNjE5NjYtMi4xAAAAAAAAAAAAAAAsUmVmZXJlbmNlIFZpZXdpbmcgQ29uZGl0aW9uIGluIElFQzYxOTY2LTIuMQAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAdmlldwAAAAAAE6T+ABRfLgAQzxQAA+3MAAQTCwADXJ4AAAABWFlaIAAAAAAATAlWAFAAAABXH+dtZWFzAAAAAAAAAAEAAAAAAAAAAAAAAAAAAAAAAAACjwAAAAJzaWcgAAAAAENSVCBjdXJ2AAAAAAAABAAAAAAFAAoADwAUABkAHgAjACgALQAyADcAOwBAAEUASgBPAFQAWQBeAGMAaABtAHIAdwB8AIEAhgCLAJAAlQCaAJ8ApACpAK4AsgC3ALwAwQDGAMsA0ADVANsA4ADlAOsA8AD2APsBAQEHAQ0BEwEZAR8BJQErATIBOAE+AUUBTAFSAVkBYAFnAW4BdQF8AYMBiwGSAZoBoQGpAbEBuQHBAckB0QHZAeEB6QHyAfoCAwIMAhQCHQImAi8COAJBAksCVAJdAmcCcQJ6AoQCjgKYAqICrAK2AsECywLVAuAC6wL1AwADCwMWAyEDLQM4A0MDTwNaA2YDcgN+A4oDlgOiA64DugPHA9MD4APsA/kEBgQTBCAELQQ7BEgEVQRjBHEEfgSMBJoEqAS2BMQE0wThBPAE/gUNBRwFKwU6BUkFWAVnBXcFhgWWBaYFtQXFBdUF5QX2BgYGFgYnBjcGSAZZBmoGewaMBp0GrwbABtEG4wb1BwcHGQcrBz0HTwdhB3QHhgeZB6wHvwfSB+UH+AgLCB8IMghGCFoIbgiCCJYIqgi+CNII5wj7CRAJJQk6CU8JZAl5CY8JpAm6Cc8J5Qn7ChEKJwo9ClQKagqBCpgKrgrFCtwK8wsLCyILOQtRC2kLgAuYC7ALyAvhC/kMEgwqDEMMXAx1DI4MpwzADNkM8w0NDSYNQA1aDXQNjg2pDcMN3g34DhMOLg5JDmQOfw6bDrYO0g7uDwkPJQ9BD14Peg+WD7MPzw/sEAkQJhBDEGEQfhCbELkQ1xD1ERMRMRFPEW0RjBGqEckR6BIHEiYSRRJkEoQSoxLDEuMTAxMjE0MTYxODE6QTxRPlFAYUJxRJFGoUixStFM4U8BUSFTQVVhV4FZsVvRXgFgMWJhZJFmwWjxayFtYW+hcdF0EXZReJF64X0hf3GBsYQBhlGIoYrxjVGPoZIBlFGWsZkRm3Gd0aBBoqGlEadxqeGsUa7BsUGzsbYxuKG7Ib2hwCHCocUhx7HKMczBz1HR4dRx1wHZkdwx3sHhYeQB5qHpQevh7pHxMfPh9pH5Qfvx/qIBUgQSBsIJggxCDwIRwhSCF1IaEhziH7IiciVSKCIq8i3SMKIzgjZiOUI8Ij8CQfJE0kfCSrJNolCSU4JWgllyXHJfcmJyZXJocmtyboJxgnSSd6J6sn3CgNKD8ocSiiKNQpBik4KWspnSnQKgIqNSpoKpsqzysCKzYraSudK9EsBSw5LG4soizXLQwtQS12Last4S4WLkwugi63Lu4vJC9aL5Evxy/+MDUwbDCkMNsxEjFKMYIxujHyMioyYzKbMtQzDTNGM38zuDPxNCs0ZTSeNNg1EzVNNYc1wjX9Njc2cjauNuk3JDdgN5w31zgUOFA4jDjIOQU5Qjl/Obw5+To2OnQ6sjrvOy07azuqO+g8JzxlPKQ84z0iPWE9oT3gPiA+YD6gPuA/IT9hP6I/4kAjQGRApkDnQSlBakGsQe5CMEJyQrVC90M6Q31DwEQDREdEikTORRJFVUWaRd5GIkZnRqtG8Ec1R3tHwEgFSEtIkUjXSR1JY0mpSfBKN0p9SsRLDEtTS5pL4kwqTHJMuk0CTUpNk03cTiVObk63TwBPSU+TT91QJ1BxULtRBlFQUZtR5lIxUnxSx1MTU19TqlP2VEJUj1TbVShVdVXCVg9WXFapVvdXRFeSV+BYL1h9WMtZGllpWbhaB1pWWqZa9VtFW5Vb5Vw1XIZc1l0nXXhdyV4aXmxevV8PX2Ffs2AFYFdgqmD8YU9homH1YklinGLwY0Njl2PrZEBklGTpZT1lkmXnZj1mkmboZz1nk2fpaD9olmjsaUNpmmnxakhqn2r3a09rp2v/bFdsr20IbWBtuW4SbmtuxG8eb3hv0XArcIZw4HE6cZVx8HJLcqZzAXNdc7h0FHRwdMx1KHWFdeF2Pnabdvh3VnezeBF4bnjMeSp5iXnnekZ6pXsEe2N7wnwhfIF84X1BfaF+AX5ifsJ/I3+Ef+WAR4CogQqBa4HNgjCCkoL0g1eDuoQdhICE44VHhauGDoZyhteHO4efiASIaYjOiTOJmYn+imSKyoswi5aL/IxjjMqNMY2Yjf+OZo7OjzaPnpAGkG6Q1pE/kaiSEZJ6kuOTTZO2lCCUipT0lV+VyZY0lp+XCpd1l+CYTJi4mSSZkJn8mmia1ZtCm6+cHJyJnPedZJ3SnkCerp8dn4uf+qBpoNihR6G2oiailqMGo3aj5qRWpMelOKWpphqmi6b9p26n4KhSqMSpN6mpqhyqj6sCq3Wr6axcrNCtRK24ri2uoa8Wr4uwALB1sOqxYLHWskuywrM4s660JbSctRO1irYBtnm28Ldot+C4WbjRuUq5wro7urW7LrunvCG8m70VvY++Cr6Evv+/er/1wHDA7MFnwePCX8Lbw1jD1MRRxM7FS8XIxkbGw8dBx7/IPci8yTrJuco4yrfLNsu2zDXMtc01zbXONs62zzfPuNA50LrRPNG+0j/SwdNE08bUSdTL1U7V0dZV1tjXXNfg2GTY6Nls2fHadtr724DcBdyK3RDdlt4c3qLfKd+v4DbgveFE4cziU+Lb42Pj6+Rz5PzlhOYN5pbnH+ep6DLovOlG6dDqW+rl63Dr++yG7RHtnO4o7rTvQO/M8Fjw5fFy8f/yjPMZ86f0NPTC9VD13vZt9vv3ivgZ+Kj5OPnH+lf65/t3/Af8mP0p/br+S/7c/23////uAA5BZG9iZQBkQAAAAAH/2wCEAAICAgICAgICAgIDAgICAwQDAgIDBAUEBAQEBAUGBQUFBQUFBgYHBwgHBwYJCQoKCQkMDAwMDAwMDAwMDAwMDAwBAwMDBQQFCQYGCQ0KCQoNDw4ODg4PDwwMDAwMDw8MDAwMDAwPDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDP/AABEIAEwAZAMBEQACEQEDEQH/3QAEAA3/xAGiAAAABwEBAQEBAAAAAAAAAAAEBQMCBgEABwgJCgsBAAICAwEBAQEBAAAAAAAAAAEAAgMEBQYHCAkKCxAAAgEDAwIEAgYHAwQCBgJzAQIDEQQABSESMUFRBhNhInGBFDKRoQcVsUIjwVLR4TMWYvAkcoLxJUM0U5KismNzwjVEJ5OjszYXVGR0w9LiCCaDCQoYGYSURUaktFbTVSga8uPzxNTk9GV1hZWltcXV5fVmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9zhIWGh4iJiouMjY6PgpOUlZaXmJmam5ydnp+So6SlpqeoqaqrrK2ur6EQACAgECAwUFBAUGBAgDA20BAAIRAwQhEjFBBVETYSIGcYGRMqGx8BTB0eEjQhVSYnLxMyQ0Q4IWklMlomOywgdz0jXiRIMXVJMICQoYGSY2RRonZHRVN/Kjs8MoKdPj84SUpLTE1OT0ZXWFlaW1xdXl9UZWZnaGlqa2xtbm9kdXZ3eHl6e3x9fn9zhIWGh4iJiouMjY6Pg5SVlpeYmZqbnJ2en5KjpKWmp6ipqqusra6vr/2gAMAwEAAhEDEQA/APv5irsVY9rvmrQfLkfLVb9IZSKx2i/HM3hRFqaHxNB74QLRbxvWfzsmJePQtJSNP2bm9Ysx/wCecZAH/BHJcKOJ5xqH5mec74ktrktsh6R2yrCB8igDfecPCEWxG58x65cEmfWr6YnqXuJG/W2GlS463qqGqandIfFZnB/XhpUZbee/N9gf9F8y6igG4Rrh5F/4Fyw/DBQW2ZaX+e/nLTyq3/1TWoR9r14hFJT2eHgK/NTg4Qm3sHlv89vKOsNHb6sJPLl49BW4IktiT2EygU+bqo98iYlNvaIZobmKO4t5UngmUPDNGwZHU7gqwqCD7ZFKrirsVf/Q+/hNNzsB1OKvBvPH5rGJ5tK8ryqSlUudYoGFe4gB2/2R/wBj2OTEWJL5/ubua4lknuJnnmlYtLNIxZmY9SzGpJyTFL3l98UoN5KnbcnphVken+R/OWsKr2Hl28eJ/sTSp6CMPEPKUU/fgsLTJYvyS8+zir29la1/ZluVJ/5Jh8HEE06X8iPPdCVk0x/8kXD1/GMY8QWmP3/5M/mNaKXXRFvFXqbe5hY/QpdWP0DDxBaeaazoeu6E/p6zo95pbE0U3MLxq3+qzAA/QcIKp35L/M3zJ5FuVbTbo3OmM/K70W4JaCQH7RUf7rY/zL7VqNsTG1fdXkjz1ofn3SRqejy8ZYqJqOnSEetbSEfZcDqDT4WGx+YIFRFMmZ4Ff//R+xv5t+cpNPiXy1p0vC4u4+eqTKd1hb7MYPi/U+3zyUQxJfNTy++TYoR5ffCr0fyR+WOr+bgl/dOdK0Ina7ZayT06iFDTbtyO3hyoRkTKmQD6a8veRvLHlhEOmaXH9aQCuozgS3BPj6jD4a+C0HtkCbTT5S86/wDOcv5f+R/N3mTyfqHlDzDd3vlnUbjTbq6t/qnpSPbuUZk5zK1CRtUZ2Wj9itTqcMM0ckAJgHe+vweZ1PtTgwZZYzCRMSR06fFi3/RRD8sv+pI8z/dZf9lGZH+gHVf6pD7f1NH+jDT/AMyX2frWn/n4n+WQ/wCmH8z/APTl/wBlGP8AoB1X+qQ+39S/6MNP/Ml9n61p/wCfiv5Yj/ph/M//AE5f9lGP+gLVf6pD7f1L/ow0/wDMl9n61a3/AOfhP5Oai5sdZ8neZrawuBwmkkt7K5jof9+R/WQSPkD8srn7CayIuM4E+8j9DOHtdpiaMZD5frZbb6J+TH57aZea1+Svmixi120T1bzy+vO3pU0/fWcyrLACfhV0X0yeleuc5ruzNVoJVngY3yPMH3EbfDm73R9oafWC8UgfLqPhzeL+XfMvmP8AK3zf9YMEtnf6bMbbWdJl+ETRVHqRP1BBG6sKitGFcwiLDmP0X/xdof8AhP8Axp9a/wBwP1D9I+vQcvS48uPGv26/Dxr9rbKa3pk//9L6HeadWfVvMGsag7cvrN3IU9kVuKD6FAGWgMGLvL74VZ3+WnlRPN/mRILtSdK05PrOpDpzAICRV/yz19gcEjSQH2xHHHDHHFFGsUUShIokAVVVRQAAbAAZUyX4q/nk/wCcgz/yHD82R/39Wqf9RD5732F/iGD+pH7nyDtf/HMv9c/e8aY/dm1dcpMcVUSfvwJUif7cCp35Y81+YPJWv6Z5o8rarPouuaRMJrG/t24srDqrDoysKqysCrAkMCDlGp02PUYzjyASieYP4+1twZ54JicDUh1frJ5217T/AM3/AMofIH556faR2WqX6/orzbaQ/ZS5iLxt13ossbBSdyjp4Z4d2poDoNVPAdwDse8HcfjvfW+zdYNZp45ep5+8c0g/x3d/8qS/wh6x/wCUi4dT/vH6X1n0/wDkf8Wa+t3Of//T94azFJY6rqdlKCstndTQyKexRyp/VlwYJG8vvir6T/5x4lgZPNcdR9Z5WbHxKUmH4HITZB9K5BLsVfzv/wDOQh/5Dj+bP/gVap/1EPnvXYX+IYP6kfufIO1/8cy/1z97xonNs65+0f8Azhd5L8na3+QXl2/1nyno2r30mo6mr3l7YW88pC3TgAvIjMaAUG+eQ+12szY+0ZxhOQFR2BI6PpPs3psU9FEygCbPMA9X1Bf/AJS/lbqdnc2F9+XPlq4tLtDHPEdKtBUEU2ZYwVI7EEEHcb5zcO1NXCQlHLMEf0j+t3k9Bp5CjjjR8g/nv/Nzy9o3lH8z/P8A5X8uzGbQtA16+sdLYv6hWGCZkVC/7RSnEnuRnuPZmonn0uPJk+qUQT7yHybX4YYdRkhD6YyIHzebs39mZziP1E/Iv1If+cKvMbXdQtz5vc6Zy7qJbMHj9KSfjnkftoQe0RX8wfpfSvZQH8kb/nH9CWfoW7/5Vn/ib0m+p/4l+oepQ05fVPUr8u1fHOWvd6R//9T6h/nj5Um0vWV8zWsROnayQt2yjaK6UUNf+Miio9+WWRLEh8/vLkkMx/Lvzu3knzNbanIGk024X6tq0K7kwOQSyj+ZCAw8enfARaQ+/bC/s9Us7bUNPuY7yyvIxJbXMZqrqehBypki8Vfzt/8AOQp/5Dl+bX/gVap/1EPnvXYX+IYP6kfufIO1/wDHMv8AXP3vGGb782rr3uPkb/nJb86Py18uWvlPyX5wGj6BZyzTW9l9QsJ+LzuXkPqT28jmrGu7bds0ut9n9DrMpy5ocUj1uQ5e4u00vbOr02MY8c6iPIH7wnup/wDOYn/OR2qWNzp8/wCZVzbwXSGOWWzsrC0nAO3wTwWySxn3RgffMfH7K9mwkJDELHeZEfImj8W2ftDrpijkO/cAPtAt8ySyvK7yyu0kkjFndiSzMdyST1JzfjbYOmJtlfkLyF5q/MzzRp3lDydpcmq61qT0VFBEcEQIDzzyUIjjStWY/LqQDia3W4tHiOXKaiPt8h3lyNLpcmpyDHjFk/iz5P1U/MTSrHyT5P8Ay2/5xt8jsdZvtC9KTXXgA5XGpXHJqEDoZJJnkIJ+EFN9s8R1+tlrdRPPL+I7eQ5AfAPreh0kdJgjij/CPmev2vqn/lTll/ypr/lWfqR/XfqnrfpCh4/pPl63q168fU+Hx4bZruLe3Mf/1fvVq+k6frum3ek6pbrdWN6hjnib7wQeoIO4I6HFXwr+Y35aa15FuZLgI+oeXpXpZ6sg+xU7RzgfYbtXo3beoFolbGnkjy++SQzzyN+avmPyDPwsZBf6PK/K60W4J9Jj3aNhvGxHcbH9oGgwGNpt9c+U/wA8vIfmdYoZ9RHl7UnoGsdSIjUsf5J/7thXYVIJ/lysxIZB+Gv/ADkFNHL+eH5syROJI381aoUdTUEG4ehB7g9s947C/wAQwf1I/c+Qdrf45l/rn73jZObR172Xyf8A847/AJ0fmB5etPNfk/yLc635fv3mS01GK5tEDtbuY5AElnRxRlI3Xftmo1fbui0uQ4suQRkK2o9fg7LT9karUQGTHAmJ62OnxeP6tpmpaHqV9pGs2Fxpeq6bM9tqGm3UbRTQSxmjJIjgFSD1BGbLHkjkiJQIIO4I5EOvnCUJGMhRHMJ35K1XybpOtJc+efKt35v0Qrxk0yy1E6ZKGqPjEwhmrQfs0Ff5h1yjV4804VhmIS7yOL7LDdpp4oTvLEyj3A8P6C/ULyN+en5cReVofKf/ADiz+Xb6FrGqenBrDS24k1KGdlJUPVp5LlgCSsskjIoB2O9PIPaHT67FnA1suK94n+Ejrw8q8xQL6d2Hl0eXCTpY8NfUP4genF3+Rsh9Qfkp+SUnkmSXzh5wnGq+e9TDu7s/rLZCapkAkJPqTPU+pJXxVSRVm5+Ur5O5fR2QV//W+/mKqU8ENzDLb3MKXFvOpSaCRQ6OrChVlNQQR1BxV86edP8AnHbRdXaa+8p3n+H7x6sdOlDSWbMf5SKvFU+HIdgoyYminzF5m/Kn8wfLLSNfeXbm6tY6/wCn2A+tQlR+0TFVkH+uFyYkCinl0jsjlHBVlNGVhQgjqCMkr4T88OW86+biTUnVrip/2We59h/8Z+n/AOFxfIu1/wDHc39csUZvuzZOvfef5Gfm7+YPlb8q9B0LQPMUmm6ZbXN+0NukFuxBluXdvjeJnPxMe+eO+18Qe1Mnuj/uQ+oezH/GfD3y+8vLPz70nzV589b8z54LvWr/AEuKK182alHBVRarRIJ5TEgUGMkISf2Svhm59iu1vDmdHkO0vVDyl/FH3S5jzvvdX7WdmcUBqoDcbT8x0l8OR8vc+Tyc9HeDe7/842/nPP8Akf8AmlpPmqTlJ5d1Bf0V5wtlXmz6dM6s7oOvOFlWRabnjx6Mc0vb3ZY7R0px/wAQ3j/W/UeR+fR2nY/aB0OoE/4TtL3fs5/2v6JLG9tNSsrPUdPuY7yw1CCO5sruJg0csMqh43RhsQykEHPEJwMJGMhRGxfWYyEgCNwUVkWT/9f7+Yq7FXYq7FUk1Py15d1qv6Y0HTtVJ6m7topj97qTjav53vz7s7TTfzr/ADWsbGBLWztvNOpxwW8YoqItw4VVHYACgz3jsM/4Bg/qR+58g7X/AMcy/wBc/e8hJzauvft1/wA4S+SvKGofkB5Q1jUPLOmahqst5qvPULq1inl+G/mVaPIrEUCgCmeM+2B/1zye6P8AuQ+oezP+IQHnL7y+x9W8vaLreg6l5Z1LTobjQtXtJrG/03gFie3nQpInEUAqCemc5hzSxTE4GpRNg+Yd5lxxyQMJCwRRfzg/nV+WGp/k9+ZHmTyHqReWLTJ/U0e/cAfW7Cb47afbarIQGA6OGXtnuvZXaMdfpo5o9RuO6XUfjo+Q9o6KWjzyxHpy8x0P46vJ2bNg4L9g/wDn35+e/wDiDQbn8l/Ml7y1jyzE935MllPxT6byrLagk7tbs3JR/vs0G0eeY+2fZHhZBqsY9MtpeUuh+P3+97/2W7T8SH5eZ3jvH3d3w+73P0szhHsH/9D7+Yq7FXYq7FXYq/nv/P3/AAf/AMrv/Nn6/wDpn6z/AIq1P1Pq/wBX9Ovrtypy3pyrT2z3DsXxvyOHh4a4I9/c+T9q+F+by3f1Hu73j5/wH/2v/wDp1zZf4R/R+1wP3P8AS+x+4P8AzhP9Q/6F28n/AKN+sfVPreren9a4+rX9IT1rw2655D7W8X8oz4quo8v6ofSvZyvyMOHlZ+8vq/Obd6/Lb/n4z/yrj6z+W/6X+t/444XX/HP9P1P0RXb1/U2p69fS/wCeuehew/5msvDXh7c/53l8OfweK9rfAvHxXx78v5vn8eXxfmIf8Bf9r/8A6dc739//AEfteN/c/wBL7Ho/5O0/5Wl5F/5Vh/iD/Hn6Xt/8P1+q+nz5fvfW7el6XP1K7cOVdq5gdqf4rk/McPh8Jvn9nnfLzczs/wDxiHg8XHe3L8VXPyf0e54e+tv/2Q==\",\"index\":0},\"iconSize\":[[25,19]]},null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[-39.04560029769151,-35.72534686878304],\"lng\":[173.4338079809993,177.2567496719338]}},\"evals\":[],\"jsHooks\":[]} # circle (units in metres) m %>% addCircles(rand_lng(50), rand_lat(50), radius = runif(50, 50, 150)) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircles\",\"args\":[[42.04118504738695,42.0256989560957,42.03761053989658,42.0485439453989,42.03097140421073,42.02420923906185,42.00666244878454,42.02726365103967,42.031373838787,42.02478400731165,42.04476562257072,42.03159908346014,42.01285959335932,42.01619376534975,42.01479802517896,42.0295655580483,42.02451174508039,42.02496593870066,42.03084501126212,42.04619789883558,42.03307876384229,42.03993758111794,42.01542277379194,42.01907450398878,42.02755038749183,42.01719953026272,42.01393791963352,42.01151282485538,42.01609173309476,42.01791700950565,42.02095621432708,42.02264893057676,42.03408142081494,42.02830993417191,42.02680643975616,42.04145330716166,42.01423940004197,42.04604103727082,42.00734424731192,42.03859702424425,42.03104535083008,42.02472445870784,42.03222469256622,42.01387318889537,42.03753709291824,42.02284445003706,42.02570248930685,42.04009675299442,42.02727913496103,42.02252142735843],[-93.66937313887567,-93.64109637302742,-93.65112423111796,-93.65224072408583,-93.66283825031186,-93.66342499016994,-93.66070571510903,-93.66552867101456,-93.65493495109065,-93.64761679114466,-93.64972581626884,-93.64771146289614,-93.65069811729082,-93.64038275022233,-93.64579992674997,-93.65384825945657,-93.671557429167,-93.6630964531638,-93.64574191654903,-93.66527475419839,-93.65075326634312,-93.66724481024896,-93.64687616512069,-93.65557059748197,-93.66112549886184,-93.6432659860078,-93.65001044417319,-93.66149541691313,-93.64035771427224,-93.64594144522545,-93.65509258780739,-93.65917171363408,-93.64616736664502,-93.63967017934021,-93.64869478600014,-93.64110166036663,-93.65672486250088,-93.64925014703617,-93.62698720352748,-93.64967244916005,-93.65069560797646,-93.64484378006317,-93.63607033455025,-93.63981436828769,-93.6494698944272,-93.64419725246965,-93.65594179494299,-93.65371855337753,-93.66423035199885,-93.6614048381664],[78.06568304076791,68.93211116548628,104.7432707622647,71.25135480891913,113.7151221977547,68.77734777517617,94.08672254066914,88.40627197641879,117.37618339248,68.76332280226052,89.64051802176982,103.9464476983994,124.6747818542644,126.4405827736482,147.6377381477505,134.1458254028112,77.775515220128,120.1250159181654,116.2139775929973,137.7708123996854,111.0746057704091,106.872813613154,52.27500174660236,121.8340002931654,115.6661416403949,95.38228197488934,141.3841662928462,131.7140431376174,131.8184578325599,99.33831670787185,76.13777990918607,67.81867318786681,92.00866417959332,64.45462454576045,103.5692346747965,53.69526075664908,136.2576556857675,64.30871449410915,68.74506573658437,62.92741047218442,141.6686865035444,115.0721014244482,109.8848532419652,139.8004586109892,81.79975005332381,54.98697522561997,121.0799474501982,95.08143833372742,106.6425233380869,66.56146738678217],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null,null]}],\"limits\":{\"lat\":[42.00666244878454,42.0485439453989],\"lng\":[-93.671557429167,-93.62698720352748]}},\"evals\":[],\"jsHooks\":[]} # circle marker (units in pixels) m %>% addCircleMarkers(rand_lng(50), rand_lat(50), color = \"#ff0000\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.03946635786205,42.04423426297234,42.03288906404404,42.02576153535955,42.03466221192998,42.02500030975305,42.03594181871352,42.01812115353374,42.01869579667493,42.01412334210437,42.02753386798638,42.02863212847178,42.02964593809743,42.04516272853054,42.02313496112895,42.04274024145383,42.0361846891379,42.03703083437098,42.0237461786521,42.02599125001583,42.02787956745635,42.03395192481936,42.03415842529349,42.01896133921827,42.02207319881965,42.03188814432313,42.02530126646926,42.01884855455839,42.01588977763138,42.04440902192393,42.02662555556533,42.0299342103505,42.02648979494051,42.03550592266395,42.01267463464795,42.03310625635562,42.02222552331378,42.04223965697321,42.02225861626528,42.0009972279664,42.02670170884879,42.01753642937315,42.03802928890393,42.02188969994155,42.05141207061222,42.03269176381549,42.03431516889857,42.02643725099102,42.02748772833064,42.01734758967195],[-93.65254902841257,-93.64430422932153,-93.6570545846247,-93.65200650026348,-93.66379594726838,-93.63568431771144,-93.64363732970774,-93.64581756180711,-93.64666026071778,-93.64085163989151,-93.65648525255611,-93.6558381751129,-93.63882915987506,-93.65229160401427,-93.65627103916168,-93.6291426153964,-93.65252181282814,-93.63723453102557,-93.65413556031783,-93.64429729703605,-93.64566027338677,-93.64462018810859,-93.6546463062607,-93.63785710578593,-93.64338051084825,-93.65925800297747,-93.65778266018414,-93.64093781995349,-93.6421832513434,-93.65257065264505,-93.66198556198819,-93.66035120660224,-93.65563871058536,-93.65976150405669,-93.66664477774114,-93.63695709729708,-93.66202279262676,-93.64090005796812,-93.65122059275177,-93.64905915510415,-93.63670824073226,-93.63857694158541,-93.64732885826845,-93.64375299085437,-93.66570581528498,-93.63726020348038,-93.65649271780273,-93.63270427254739,-93.65110558501327,-93.66730261723593],10,null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#ff0000\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#ff0000\",\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.0009972279664,42.05141207061222],\"lng\":[-93.66730261723593,-93.6291426153964]}},\"evals\":[],\"jsHooks\":[]}m %>% addCircleMarkers(rand_lng(100), rand_lat(100), radius = runif(100, 5, 15)) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.03139382301159,42.03131457072642,42.01227352436597,42.03104176426201,42.04190461182773,42.02736887199652,42.03153450133026,42.03589178037707,42.03283381042127,42.04045457350151,42.01690151628789,42.03324406738251,42.02583754240751,42.03678473726934,42.03701016791823,42.02749145896812,42.02325699379563,42.00191744490117,42.02806289482762,42.02349636696815,42.02588686782479,42.03820117195004,42.01534267103118,42.04284004284053,42.02713297963835,42.01020835737707,42.0300710896609,42.02548970451941,42.01441370800854,42.02283630873292,42.0451916697922,42.02723652685268,42.04055623359034,42.02754042799931,42.01815255702064,42.03348846726976,42.03062249499183,42.02378441899302,42.04643346593294,42.03500836713697,42.0224450072994,42.03826492097145,42.0234422801148,42.04204956305226,42.02524658817892,42.04201890213911,42.03748629390856,42.0214492746506,42.03604731199234,42.044965012277,41.99598647555202,42.02199009409272,42.02527626116924,42.03714508267493,42.03105943154083,42.01186943298647,42.02129363851798,42.03100080542538,42.01331798760197,42.03297007895823,42.03750320899652,42.03109821487963,42.03867965689039,42.03464271349885,42.02610591988064,42.01046850719147,42.02863425676254,42.02782671313301,42.04528755418297,42.02598542787371,42.01994751122161,42.02879318304911,42.02497910512447,42.01481954835298,42.03334613390476,42.0214962298734,42.0268512107045,42.03308015157729,42.03219496335166,42.03664652993615,42.02417714955119,42.04004377044308,42.04365261449227,42.03067893525224,42.03190447641499,42.04143091855217,42.04456693041365,42.02376496017807,42.03194269175073,42.01754210638398,42.0388615023908,42.03141469314912,42.01519944188558,42.04049611607736,42.02719664819917,42.02420001013732,42.01903171286035,42.01873051530971,42.03106106771453,42.03352862702666],[-93.65535611192416,-93.64498900814321,-93.64963480212587,-93.64541131211486,-93.66521969877439,-93.65442283180555,-93.66773276869181,-93.64461048057697,-93.64277675367762,-93.64417042308612,-93.64462646648929,-93.64714430273224,-93.66482057456456,-93.62536381217032,-93.64868206977155,-93.65252806462894,-93.64008948950905,-93.66338089776762,-93.63864157127118,-93.64943604632572,-93.64961894889667,-93.65430235214177,-93.65553782493306,-93.66708852809485,-93.65554707049687,-93.64220326843139,-93.64579162342447,-93.65583530064413,-93.6413696980473,-93.66049878387568,-93.66376696316098,-93.64521295982385,-93.6511379976028,-93.65602881765466,-93.65629993268512,-93.65345159402762,-93.64964639104949,-93.67973885881058,-93.66566146013689,-93.63524243415587,-93.64457010861922,-93.66048817881108,-93.65617483221058,-93.65554655207391,-93.64821705008474,-93.64172455253075,-93.63865009614665,-93.64437720901238,-93.6320981242151,-93.65306880223694,-93.65841409786624,-93.6539766978739,-93.65243537341044,-93.64317030372932,-93.6413748725688,-93.65040741918902,-93.64141362303553,-93.66162152117245,-93.6468268336809,-93.66212990119476,-93.64844374414152,-93.65862042388578,-93.65349729267643,-93.65586681455501,-93.65849060725076,-93.64410307000117,-93.64332756587662,-93.63895947704735,-93.66149450995327,-93.65453019857799,-93.6276107518126,-93.65304553953214,-93.65319894764986,-93.64595756520723,-93.64704301884834,-93.64872819322476,-93.64839147993828,-93.6443842861557,-93.64924220526122,-93.63776198017885,-93.64422654019363,-93.66858473531995,-93.65727858218989,-93.65265113988491,-93.64287777896372,-93.64901357249778,-93.6484548025275,-93.65860153676819,-93.63499374394719,-93.65251282933164,-93.65032197216577,-93.65151554267761,-93.63498382525141,-93.64388572763998,-93.64834841350275,-93.66902026286084,-93.66752261966002,-93.6747583432476,-93.65208157174324,-93.64523303428503],[10.29429597081617,8.622156181372702,13.05342986481264,12.3296674201265,7.343654199503362,11.60355402622372,5.328561237547547,9.604916137177497,10.95951206749305,9.222959498874843,5.787752650212497,12.32753598829731,5.417331401258707,9.810585284139961,8.545346057508141,6.366096960846335,11.39315407257527,12.25025215884671,14.54391124425456,7.089333012700081,9.044184705708176,12.93640323914587,9.68192977597937,13.65355333779007,13.84180626831949,14.22194473212585,11.50977266021073,11.92100784741342,14.66504436451942,5.981152725871652,6.663144568447024,12.93203699402511,6.112266723066568,7.416913681663573,9.038710205350071,8.590880089905113,14.15660251863301,7.47517763171345,12.60489414678887,6.278453792911023,5.214693432208151,7.863010682631284,7.108870267402381,5.886595482006669,9.308966270182282,7.575619416311383,11.94229549495503,5.050908429548144,12.25495903287083,11.29896911559626,14.26709386520088,11.94528787396848,14.17119325371459,8.095572907477617,13.25382635463029,6.72485240502283,13.59619680093601,6.16149102570489,7.927293421234936,14.11753519205377,9.054653272032738,7.696460611186922,13.34075686056167,7.524813553318381,12.02279969118536,5.980837971437722,11.11713781021535,12.94667060952634,7.938313740305603,14.98685538070276,10.60312955873087,13.68481491692364,11.50048445211723,5.0238775042817,14.5818458031863,14.47091881651431,14.87428131978959,11.96311163716018,14.76428579539061,11.92443791544065,14.71561374608427,7.310809656046331,10.54241922916844,6.33819046895951,8.239021063782275,12.63330595334992,6.595519778784364,11.57576124882326,10.36680360324681,5.669132708571851,11.69581747846678,6.105556406546384,6.688631461001933,14.22971677966416,14.89287599921227,12.03842387301847,5.979038719087839,8.159251769538969,6.166858170181513,12.60761911282316],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[41.99598647555202,42.04643346593294],\"lng\":[-93.67973885881058,-93.62536381217032]}},\"evals\":[],\"jsHooks\":[]} # rectangle m %>% addRectangles( rand_lng(), rand_lat(), rand_lng(), rand_lat(), color = \"red\", fill = FALSE, dashArray = \"5,5\", weight = 3 ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addRectangles\",\"args\":[[42.03531386076063,42.02008068719508,42.02348698610535,42.01592188867964,42.04931183395641,42.01853728233499,42.01503181750024,42.01928660661697,42.05874370932054,42.05413573651914],[-93.64293487516746,-93.67933758790726,-93.65258555683351,-93.66069520490615,-93.63933621063865,-93.65639754058024,-93.651123361751,-93.64421632687144,-93.65026220920639,-93.66138633722051],[42.05240643815082,42.02153420947384,42.03707869527642,42.0420269253829,42.03095758984068,42.03656324691026,42.02109975245402,42.02245546555657,42.03703258551537,42.02009825834853],[-93.63997864861673,-93.64311041241332,-93.64682034965479,-93.66862551419028,-93.65563477648162,-93.64183080010871,-93.66132326778798,-93.6465048692109,-93.65167182641599,-93.65037946950673],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"red\",\"weight\":3,\"opacity\":0.5,\"fill\":false,\"fillColor\":\"red\",\"fillOpacity\":0.2,\"dashArray\":\"5,5\",\"smoothFactor\":1,\"noClip\":false},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.01503181750024,42.05874370932054],\"lng\":[-93.67933758790726,-93.63933621063865]}},\"evals\":[],\"jsHooks\":[]} # polyline m %>% addPolylines(rand_lng(50), rand_lat(50)) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addPolylines\",\"args\":[[[[{\"lng\":[-93.652972983574,-93.63956634639858,-93.67655064558004,-93.6514601148437,-93.64887840737111,-93.64656062246287,-93.63712290871597,-93.64102274900146,-93.64637872866817,-93.64894310246346,-93.65131956158362,-93.63932149756748,-93.64074737459669,-93.63676148920567,-93.63965778350186,-93.64852112370453,-93.64664276978237,-93.65644610970732,-93.66045565709707,-93.66368633466951,-93.65507365184034,-93.64857239632845,-93.65522575471802,-93.65218278601664,-93.66198830265246,-93.64712614308557,-93.63903263047496,-93.65694464715423,-93.66355603226674,-93.65252509665768,-93.65026414224634,-93.6377214099622,-93.64179166928103,-93.6486308304587,-93.63895571127897,-93.65934792887226,-93.65318536676949,-93.63817978608303,-93.6489318602445,-93.66172871016238,-93.63987690168837,-93.64406172268818,-93.66004868391832,-93.63750815308495,-93.65130497574164,-93.64842143788051,-93.63109990353027,-93.64374026886168,-93.66685038000773,-93.62750228037102],\"lat\":[42.02489662778101,42.04565054180035,42.0220669195108,42.02634634383799,42.03367537296126,42.03741485412495,42.03305866409079,42.01885444659105,42.02520085207016,42.03479722358253,42.03020567893518,42.02773406857008,42.02570992705288,42.03055933088892,42.03201860468176,42.03748994224257,42.01896972726991,42.03500050778156,42.02186223827843,42.04204757292183,42.0198254383831,42.02901292616725,42.04426029572173,42.03825416795208,42.03621690633857,42.0274500370836,42.02081060718391,42.03920701340228,42.02670127619658,42.01757369299568,42.00902923859864,42.01328420800149,42.02695876555808,42.03736219339599,42.01430741138624,42.0324320931384,42.01998158202134,42.03578167189465,42.04566373175746,42.024524205981,42.02872869686823,42.04292693014155,42.01965415018971,42.05156736581608,42.02752365574212,42.02337214412228,42.02711853281946,42.04153417458208,42.026149573937,42.03395335678854]}]]],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":false,\"fillColor\":\"#03F\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00902923859864,42.05156736581608],\"lng\":[-93.67655064558004,-93.62750228037102]}},\"evals\":[],\"jsHooks\":[]} # polygon m %>% addPolygons(rand_lng(), rand_lat(), layerId = \"foo\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addPolygons\",\"args\":[[[[{\"lng\":[-93.66230733512604,-93.66362211464309,-93.65235880551107,-93.66249257449554,-93.63673320543423,-93.65709752194779,-93.64162963152377,-93.64937000329466,-93.65120490794359,-93.63382183031048],\"lat\":[42.04073450951627,42.02861734752911,42.03184055284404,42.01785872494543,42.03124030624387,42.02481425625695,42.0239277901462,42.03580823221426,42.02892499982967,42.00378646313765]}]]],\"foo\",null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00378646313765,42.04073450951627],\"lng\":[-93.66362211464309,-93.63382183031048]}},\"evals\":[],\"jsHooks\":[]} # geoJSON seattle_geojson <- list( type = \"Feature\", geometry = list( type = \"MultiPolygon\", coordinates = list(list(list( c(-122.36075812146, 47.6759920119894), c(-122.360781646764, 47.6668890126755), c(-122.360782108665, 47.6614990696722), c(-122.366199035722, 47.6614990696722), c(-122.366199035722, 47.6592874248973), c(-122.364582509469, 47.6576254522105), c(-122.363887331445, 47.6569107302038), c(-122.360865528129, 47.6538418253251), c(-122.360866157644, 47.6535254473167), c(-122.360866581103, 47.6533126275176), c(-122.362526540691, 47.6541872926348), c(-122.364442114483, 47.6551892850798), c(-122.366077719797, 47.6560733960606), c(-122.368818463838, 47.6579742346694), c(-122.370115159943, 47.6588730808334), c(-122.372295967029, 47.6604350102328), c(-122.37381369088, 47.660582362063), c(-122.375522972109, 47.6606413027949), c(-122.376079703095, 47.6608793094619), c(-122.376206315662, 47.6609242364243), c(-122.377610811371, 47.6606160735197), c(-122.379857378879, 47.6610306942278), c(-122.382454873022, 47.6627496239169), c(-122.385357955057, 47.6638573778241), c(-122.386007328104, 47.6640865692306), c(-122.387186331506, 47.6654326177161), c(-122.387802656231, 47.6661492860294), c(-122.388108244121, 47.6664548739202), c(-122.389177800763, 47.6663784774359), c(-122.390582858689, 47.6665072251861), c(-122.390793942299, 47.6659699214511), c(-122.391507906234, 47.6659200946229), c(-122.392883050767, 47.6664166747017), c(-122.392847210144, 47.6678696739431), c(-122.392904778401, 47.6709016021624), c(-122.39296705153, 47.6732047491624), c(-122.393000803496, 47.6759322346303), c(-122.37666945305, 47.6759896300663), c(-122.376486363943, 47.6759891899754), c(-122.366078869215, 47.6759641734893), c(-122.36075812146, 47.6759920119894) ))) ), properties = list( name = \"Ballard\", population = 48000, # You can inline styles if you want style = list( fillColor = \"yellow\", weight = 2, color = \"#000000\" ) ), id = \"ballard\" ) m %>% setView(-122.36075812146, 47.6759920119894, zoom = 13) %>% addGeoJSON(seattle_geojson) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addGeoJSON\",\"args\":[{\"type\":\"Feature\",\"geometry\":{\"type\":\"MultiPolygon\",\"coordinates\":[[[[-122.36075812146,47.6759920119894],[-122.360781646764,47.6668890126755],[-122.360782108665,47.6614990696722],[-122.366199035722,47.6614990696722],[-122.366199035722,47.6592874248973],[-122.364582509469,47.6576254522105],[-122.363887331445,47.6569107302038],[-122.360865528129,47.6538418253251],[-122.360866157644,47.6535254473167],[-122.360866581103,47.6533126275176],[-122.362526540691,47.6541872926348],[-122.364442114483,47.6551892850798],[-122.366077719797,47.6560733960606],[-122.368818463838,47.6579742346694],[-122.370115159943,47.6588730808334],[-122.372295967029,47.6604350102328],[-122.37381369088,47.660582362063],[-122.375522972109,47.6606413027949],[-122.376079703095,47.6608793094619],[-122.376206315662,47.6609242364243],[-122.377610811371,47.6606160735197],[-122.379857378879,47.6610306942278],[-122.382454873022,47.6627496239169],[-122.385357955057,47.6638573778241],[-122.386007328104,47.6640865692306],[-122.387186331506,47.6654326177161],[-122.387802656231,47.6661492860294],[-122.388108244121,47.6664548739202],[-122.389177800763,47.6663784774359],[-122.390582858689,47.6665072251861],[-122.390793942299,47.6659699214511],[-122.391507906234,47.6659200946229],[-122.392883050767,47.6664166747017],[-122.392847210144,47.6678696739431],[-122.392904778401,47.6709016021624],[-122.39296705153,47.6732047491624],[-122.393000803496,47.6759322346303],[-122.37666945305,47.6759896300663],[-122.376486363943,47.6759891899754],[-122.366078869215,47.6759641734893],[-122.36075812146,47.6759920119894]]]]},\"properties\":{\"name\":\"Ballard\",\"population\":48000,\"style\":{\"fillColor\":\"yellow\",\"weight\":2,\"color\":\"#000000\"}},\"id\":\"ballard\"},null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false}]}],\"setView\":[[47.6759920119894,-122.36075812146],13,[]]},\"evals\":[],\"jsHooks\":[]} # use the Dark Matter layer from CartoDB leaflet() %>% addTiles(\"https://{s}.basemaps.cartocdn.com/dark_all/{z}/{x}/{y}.png\", attribution = paste( \"© OpenStreetMap<\/a> contributors\", \"© CartoDB<\/a>\" ) ) %>% setView(-122.36, 47.67, zoom = 10) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.basemaps.cartocdn.com/dark_all/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a> contributors © CartoDB<\\/a>\"}]}],\"setView\":[[47.67,-122.36],10,[]]},\"evals\":[],\"jsHooks\":[]} # provide a data frame to leaflet() categories <- LETTERS[1:10] df <- data.frame( lat = rand_lat(100), lng = rand_lng(100), size = runif(100, 5, 20), category = factor(sample(categories, 100, replace = TRUE), levels = categories), value = rnorm(100) ) m <- leaflet(df) %>% addTiles() m %>% addCircleMarkers(~lng, ~lat, radius = ~size) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.0275439469367,42.02850856687817,42.02471710192324,42.03856490439633,42.02617552024589,42.02185988769047,42.03201242237268,42.02156836879088,42.00071745929274,42.03982404542268,42.01845138245503,42.0145462442034,42.02713285607175,42.03331993717762,42.03942914269688,42.01528218729826,42.03905582360974,42.02689046633677,42.02676699091157,42.02558251597001,42.05096668795214,42.032210951063,42.04086263070892,42.03730671421407,42.03781360320225,42.04218406398204,42.01310542696795,42.02988470783713,42.01024712620395,42.0395379742443,42.03621371549353,42.03759148573567,42.03239579190152,42.03092304970755,42.04000764170451,42.02385331692301,42.00497694162157,42.03345846489503,42.01822184158728,42.03690247746567,42.03492905051364,42.02329699643625,42.02304686530763,42.02930893183068,42.02481924587406,42.03304851136662,42.02572835523341,42.03253167147148,42.02858137871883,42.02493229196173,42.03344554007207,42.03885993007018,42.03453662331968,42.02896697574077,42.03440326830454,42.03153373039122,42.02998154371434,42.03839726794725,42.03000786056483,42.03228592948875,42.02456909646138,42.02140617683165,42.00931476024424,42.02776970753985,42.02058487732943,42.0385882223591,42.04442791183199,42.04104362241481,42.04056039863206,42.01900940574943,42.01885203526652,42.02791607640876,42.02520478385033,42.01998555810211,42.02348692232571,42.03493010366306,42.04210181811401,42.04162838622378,42.03574990755181,42.02649813426255,42.01902732870672,42.03661389540903,42.03338205254317,42.04880992805718,42.02644902111552,42.0189870196251,42.02529985536037,42.02837619205334,42.02666159607317,42.02036268722185,42.03696162266866,42.02001938132206,42.01869179289501,42.02566274377212,42.02701611639693,42.02177488465831,42.00592651448041,42.01909304157013,42.04922120754906,42.04439288395704],[-93.65154106959666,-93.65042599433595,-93.64894673668371,-93.63344615385955,-93.63650336381714,-93.63517834446287,-93.64096087565615,-93.64302240137884,-93.65970980766507,-93.65687336519353,-93.63750827942931,-93.65715438538916,-93.65581264211097,-93.66183094827997,-93.63497000238645,-93.64647378446301,-93.66227304439663,-93.66231158252228,-93.63462596707021,-93.67166005687031,-93.65953665273665,-93.64667494147291,-93.65194310671578,-93.66681968743772,-93.64116057253251,-93.64648118079009,-93.63293680687235,-93.65716902451619,-93.650088528175,-93.64820570997722,-93.65227400111098,-93.66010783848354,-93.63607970518663,-93.66379373439912,-93.63726328503033,-93.64591334734048,-93.64174706139255,-93.66316505474174,-93.64177490738993,-93.66619049960109,-93.62887364851633,-93.65925649568541,-93.64788636448064,-93.64622272894798,-93.6518088328543,-93.65642877993822,-93.65277725735886,-93.64884517690669,-93.65184949503832,-93.64688277651398,-93.62613467529516,-93.64344530962872,-93.6400142173333,-93.65649160597073,-93.65821816491015,-93.6450216957919,-93.66065500857943,-93.6496534930058,-93.64968006901142,-93.6395620322087,-93.6337064729676,-93.64244565472642,-93.64586421466817,-93.6688970531778,-93.65993756207125,-93.65539459897117,-93.65447746537514,-93.65931811321661,-93.63796320755306,-93.65121637545339,-93.6592965222663,-93.66875134637795,-93.66011924371401,-93.63659854208248,-93.62875245353796,-93.64266145297552,-93.65150969656609,-93.65252449240651,-93.63608640530559,-93.63169024927461,-93.64547683408794,-93.65741258045203,-93.66363223553533,-93.66288777620294,-93.62333999274722,-93.66239924451044,-93.65272895570001,-93.65522995481368,-93.65917870381627,-93.64153418079768,-93.64948539942503,-93.64873546796603,-93.64148059835311,-93.64484782706499,-93.63986774654656,-93.65436875099033,-93.64883541549075,-93.66166696709044,-93.66897040761957,-93.63764228488199],[8.077534276526421,5.485966079868376,9.649251458467916,5.896341383922845,13.26696534990333,12.514092217898,12.29106032173149,18.93870580708608,8.804657576838508,8.276547340210527,9.784943790873513,16.39211874105968,17.48959766933694,16.3546313601546,14.61338578956202,17.36487112939358,5.151420767651871,19.93330998811871,18.70117642451078,6.046578008681536,5.429585756501183,12.94646361959167,8.967910417122766,8.912540099117905,7.946839884389192,13.1862185022328,7.331444468582049,16.58711979631335,8.081714907893911,6.975217631552368,18.13800857053138,14.50175033998676,18.07911640731618,13.24625853914768,11.25593722099438,14.33360313181765,19.04103419394232,14.9766163143795,17.760249665007,6.531758917262778,14.75548244081438,17.11697243154049,10.14644648763351,12.35893932403997,10.26048175990582,16.11323629971594,17.23661144962534,18.3672665792983,14.90982936578803,6.503005982376635,8.385817388771102,11.45169689785689,7.563369501149282,18.12055895337835,10.99375160061754,13.13556855777279,17.67581826192327,17.80606510932557,19.31105108582415,12.879789135186,6.506128339096904,16.64688466582447,8.409437106456608,9.197224682429805,15.82827810314484,8.035586961777881,10.49104926991276,7.545773686142638,12.67594884266146,15.2026745735202,14.41742338938639,18.97705871029757,6.06701691634953,17.0168387517333,7.916135370032862,11.9601853156928,6.649805206106976,8.35004405467771,17.84352153656073,10.04383708699606,10.13097612769343,6.979987706290558,11.03796194889583,6.272663669660687,17.01876444858499,9.816488409414887,10.5149889702443,8.390462450915948,13.3317927562166,10.12469277367927,10.43406123411842,13.55476253200322,19.73118214984424,17.61772529222071,16.42703348537907,13.19420637912117,12.21818620804697,5.498720001196489,17.84487215452828,10.7387919316534],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00071745929274,42.05096668795214],\"lng\":[-93.67166005687031,-93.62333999274722]}},\"evals\":[],\"jsHooks\":[]}m %>% addCircleMarkers(~lng, ~lat, radius = runif(100, 4, 10), color = c(\"red\")) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.0275439469367,42.02850856687817,42.02471710192324,42.03856490439633,42.02617552024589,42.02185988769047,42.03201242237268,42.02156836879088,42.00071745929274,42.03982404542268,42.01845138245503,42.0145462442034,42.02713285607175,42.03331993717762,42.03942914269688,42.01528218729826,42.03905582360974,42.02689046633677,42.02676699091157,42.02558251597001,42.05096668795214,42.032210951063,42.04086263070892,42.03730671421407,42.03781360320225,42.04218406398204,42.01310542696795,42.02988470783713,42.01024712620395,42.0395379742443,42.03621371549353,42.03759148573567,42.03239579190152,42.03092304970755,42.04000764170451,42.02385331692301,42.00497694162157,42.03345846489503,42.01822184158728,42.03690247746567,42.03492905051364,42.02329699643625,42.02304686530763,42.02930893183068,42.02481924587406,42.03304851136662,42.02572835523341,42.03253167147148,42.02858137871883,42.02493229196173,42.03344554007207,42.03885993007018,42.03453662331968,42.02896697574077,42.03440326830454,42.03153373039122,42.02998154371434,42.03839726794725,42.03000786056483,42.03228592948875,42.02456909646138,42.02140617683165,42.00931476024424,42.02776970753985,42.02058487732943,42.0385882223591,42.04442791183199,42.04104362241481,42.04056039863206,42.01900940574943,42.01885203526652,42.02791607640876,42.02520478385033,42.01998555810211,42.02348692232571,42.03493010366306,42.04210181811401,42.04162838622378,42.03574990755181,42.02649813426255,42.01902732870672,42.03661389540903,42.03338205254317,42.04880992805718,42.02644902111552,42.0189870196251,42.02529985536037,42.02837619205334,42.02666159607317,42.02036268722185,42.03696162266866,42.02001938132206,42.01869179289501,42.02566274377212,42.02701611639693,42.02177488465831,42.00592651448041,42.01909304157013,42.04922120754906,42.04439288395704],[-93.65154106959666,-93.65042599433595,-93.64894673668371,-93.63344615385955,-93.63650336381714,-93.63517834446287,-93.64096087565615,-93.64302240137884,-93.65970980766507,-93.65687336519353,-93.63750827942931,-93.65715438538916,-93.65581264211097,-93.66183094827997,-93.63497000238645,-93.64647378446301,-93.66227304439663,-93.66231158252228,-93.63462596707021,-93.67166005687031,-93.65953665273665,-93.64667494147291,-93.65194310671578,-93.66681968743772,-93.64116057253251,-93.64648118079009,-93.63293680687235,-93.65716902451619,-93.650088528175,-93.64820570997722,-93.65227400111098,-93.66010783848354,-93.63607970518663,-93.66379373439912,-93.63726328503033,-93.64591334734048,-93.64174706139255,-93.66316505474174,-93.64177490738993,-93.66619049960109,-93.62887364851633,-93.65925649568541,-93.64788636448064,-93.64622272894798,-93.6518088328543,-93.65642877993822,-93.65277725735886,-93.64884517690669,-93.65184949503832,-93.64688277651398,-93.62613467529516,-93.64344530962872,-93.6400142173333,-93.65649160597073,-93.65821816491015,-93.6450216957919,-93.66065500857943,-93.6496534930058,-93.64968006901142,-93.6395620322087,-93.6337064729676,-93.64244565472642,-93.64586421466817,-93.6688970531778,-93.65993756207125,-93.65539459897117,-93.65447746537514,-93.65931811321661,-93.63796320755306,-93.65121637545339,-93.6592965222663,-93.66875134637795,-93.66011924371401,-93.63659854208248,-93.62875245353796,-93.64266145297552,-93.65150969656609,-93.65252449240651,-93.63608640530559,-93.63169024927461,-93.64547683408794,-93.65741258045203,-93.66363223553533,-93.66288777620294,-93.62333999274722,-93.66239924451044,-93.65272895570001,-93.65522995481368,-93.65917870381627,-93.64153418079768,-93.64948539942503,-93.64873546796603,-93.64148059835311,-93.64484782706499,-93.63986774654656,-93.65436875099033,-93.64883541549075,-93.66166696709044,-93.66897040761957,-93.63764228488199],[5.604605011641979,4.540006873663515,6.53969751810655,4.084984542336315,7.918386071454734,9.649420917965472,6.92048271605745,6.91589834028855,5.790993708185852,9.637910705525428,9.993599846959114,5.57119958056137,4.462711228523403,4.973153933882713,7.777389595285058,4.10572025179863,4.235488526057452,6.895790067967027,4.928339398466051,8.902905617374927,9.100599534343928,4.090442541521043,7.083072507288307,5.07656456483528,4.270971846301109,7.245370232500136,6.125029662624002,7.186123906634748,4.624782136641443,5.750216467306018,5.629352237097919,9.918148772325367,4.513271839357913,7.742806350346655,5.038326888345182,7.076984515879303,8.621841041836888,7.371562553569674,7.052881934214383,4.30950024491176,8.250742219854146,7.969794497825205,4.530376561451703,4.06879822537303,5.55781673360616,4.614050496835262,9.115869538858533,8.423064006958157,6.243736923206598,7.661491311620921,7.08214810770005,9.18612268101424,9.137943720910698,8.426644810475409,4.337124884128571,8.796433594077826,4.339948318433017,6.178227362688631,7.264035976491868,9.192307959776372,7.583647263702005,6.346588092856109,7.136722662486136,7.313094209413975,4.836021199356765,8.425387518014759,7.513740873895586,8.372442630119622,5.230354791041464,9.607509576249868,4.400237118359655,7.82166892522946,9.340043892618269,6.395246115047485,6.487273213453591,5.803202133160084,9.751131184864789,5.583944507408887,4.455971708986908,8.240967724937946,6.579753054771572,8.915545027237386,8.651618666481227,8.357707146555185,4.981246939394623,6.320858817081898,6.0975471874699,6.79316586907953,7.891539338510484,9.559912758879364,9.464868479873985,6.701976920478046,9.024282701313496,7.008666274603456,7.207120560109615,5.124245505779982,8.084227397106588,9.713494536932558,5.115731906145811,5.687003108207136],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"red\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"red\",\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00071745929274,42.05096668795214],\"lng\":[-93.67166005687031,-93.62333999274722]}},\"evals\":[],\"jsHooks\":[]} # Discrete colors using the \"RdYlBu\" colorbrewer palette, mapped to categories RdYlBu <- colorFactor(\"RdYlBu\", domain = categories) m %>% addCircleMarkers(~lng, ~lat, radius = ~size, color = ~RdYlBu(category), fillOpacity = 0.5) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.0275439469367,42.02850856687817,42.02471710192324,42.03856490439633,42.02617552024589,42.02185988769047,42.03201242237268,42.02156836879088,42.00071745929274,42.03982404542268,42.01845138245503,42.0145462442034,42.02713285607175,42.03331993717762,42.03942914269688,42.01528218729826,42.03905582360974,42.02689046633677,42.02676699091157,42.02558251597001,42.05096668795214,42.032210951063,42.04086263070892,42.03730671421407,42.03781360320225,42.04218406398204,42.01310542696795,42.02988470783713,42.01024712620395,42.0395379742443,42.03621371549353,42.03759148573567,42.03239579190152,42.03092304970755,42.04000764170451,42.02385331692301,42.00497694162157,42.03345846489503,42.01822184158728,42.03690247746567,42.03492905051364,42.02329699643625,42.02304686530763,42.02930893183068,42.02481924587406,42.03304851136662,42.02572835523341,42.03253167147148,42.02858137871883,42.02493229196173,42.03344554007207,42.03885993007018,42.03453662331968,42.02896697574077,42.03440326830454,42.03153373039122,42.02998154371434,42.03839726794725,42.03000786056483,42.03228592948875,42.02456909646138,42.02140617683165,42.00931476024424,42.02776970753985,42.02058487732943,42.0385882223591,42.04442791183199,42.04104362241481,42.04056039863206,42.01900940574943,42.01885203526652,42.02791607640876,42.02520478385033,42.01998555810211,42.02348692232571,42.03493010366306,42.04210181811401,42.04162838622378,42.03574990755181,42.02649813426255,42.01902732870672,42.03661389540903,42.03338205254317,42.04880992805718,42.02644902111552,42.0189870196251,42.02529985536037,42.02837619205334,42.02666159607317,42.02036268722185,42.03696162266866,42.02001938132206,42.01869179289501,42.02566274377212,42.02701611639693,42.02177488465831,42.00592651448041,42.01909304157013,42.04922120754906,42.04439288395704],[-93.65154106959666,-93.65042599433595,-93.64894673668371,-93.63344615385955,-93.63650336381714,-93.63517834446287,-93.64096087565615,-93.64302240137884,-93.65970980766507,-93.65687336519353,-93.63750827942931,-93.65715438538916,-93.65581264211097,-93.66183094827997,-93.63497000238645,-93.64647378446301,-93.66227304439663,-93.66231158252228,-93.63462596707021,-93.67166005687031,-93.65953665273665,-93.64667494147291,-93.65194310671578,-93.66681968743772,-93.64116057253251,-93.64648118079009,-93.63293680687235,-93.65716902451619,-93.650088528175,-93.64820570997722,-93.65227400111098,-93.66010783848354,-93.63607970518663,-93.66379373439912,-93.63726328503033,-93.64591334734048,-93.64174706139255,-93.66316505474174,-93.64177490738993,-93.66619049960109,-93.62887364851633,-93.65925649568541,-93.64788636448064,-93.64622272894798,-93.6518088328543,-93.65642877993822,-93.65277725735886,-93.64884517690669,-93.65184949503832,-93.64688277651398,-93.62613467529516,-93.64344530962872,-93.6400142173333,-93.65649160597073,-93.65821816491015,-93.6450216957919,-93.66065500857943,-93.6496534930058,-93.64968006901142,-93.6395620322087,-93.6337064729676,-93.64244565472642,-93.64586421466817,-93.6688970531778,-93.65993756207125,-93.65539459897117,-93.65447746537514,-93.65931811321661,-93.63796320755306,-93.65121637545339,-93.6592965222663,-93.66875134637795,-93.66011924371401,-93.63659854208248,-93.62875245353796,-93.64266145297552,-93.65150969656609,-93.65252449240651,-93.63608640530559,-93.63169024927461,-93.64547683408794,-93.65741258045203,-93.66363223553533,-93.66288777620294,-93.62333999274722,-93.66239924451044,-93.65272895570001,-93.65522995481368,-93.65917870381627,-93.64153418079768,-93.64948539942503,-93.64873546796603,-93.64148059835311,-93.64484782706499,-93.63986774654656,-93.65436875099033,-93.64883541549075,-93.66166696709044,-93.66897040761957,-93.63764228488199],[8.077534276526421,5.485966079868376,9.649251458467916,5.896341383922845,13.26696534990333,12.514092217898,12.29106032173149,18.93870580708608,8.804657576838508,8.276547340210527,9.784943790873513,16.39211874105968,17.48959766933694,16.3546313601546,14.61338578956202,17.36487112939358,5.151420767651871,19.93330998811871,18.70117642451078,6.046578008681536,5.429585756501183,12.94646361959167,8.967910417122766,8.912540099117905,7.946839884389192,13.1862185022328,7.331444468582049,16.58711979631335,8.081714907893911,6.975217631552368,18.13800857053138,14.50175033998676,18.07911640731618,13.24625853914768,11.25593722099438,14.33360313181765,19.04103419394232,14.9766163143795,17.760249665007,6.531758917262778,14.75548244081438,17.11697243154049,10.14644648763351,12.35893932403997,10.26048175990582,16.11323629971594,17.23661144962534,18.3672665792983,14.90982936578803,6.503005982376635,8.385817388771102,11.45169689785689,7.563369501149282,18.12055895337835,10.99375160061754,13.13556855777279,17.67581826192327,17.80606510932557,19.31105108582415,12.879789135186,6.506128339096904,16.64688466582447,8.409437106456608,9.197224682429805,15.82827810314484,8.035586961777881,10.49104926991276,7.545773686142638,12.67594884266146,15.2026745735202,14.41742338938639,18.97705871029757,6.06701691634953,17.0168387517333,7.916135370032862,11.9601853156928,6.649805206106976,8.35004405467771,17.84352153656073,10.04383708699606,10.13097612769343,6.979987706290558,11.03796194889583,6.272663669660687,17.01876444858499,9.816488409414887,10.5149889702443,8.390462450915948,13.3317927562166,10.12469277367927,10.43406123411842,13.55476253200322,19.73118214984424,17.61772529222071,16.42703348537907,13.19420637912117,12.21818620804697,5.498720001196489,17.84487215452828,10.7387919316534],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":[\"#74ADD1\",\"#74ADD1\",\"#FEE090\",\"#313695\",\"#4575B4\",\"#A50026\",\"#74ADD1\",\"#313695\",\"#A50026\",\"#D73027\",\"#ABD9E9\",\"#74ADD1\",\"#4575B4\",\"#A50026\",\"#FDAE61\",\"#F46D43\",\"#ABD9E9\",\"#A50026\",\"#FDAE61\",\"#FEE090\",\"#4575B4\",\"#F46D43\",\"#313695\",\"#FDAE61\",\"#74ADD1\",\"#74ADD1\",\"#313695\",\"#4575B4\",\"#74ADD1\",\"#ABD9E9\",\"#D73027\",\"#ABD9E9\",\"#E0F3F8\",\"#4575B4\",\"#4575B4\",\"#A50026\",\"#A50026\",\"#74ADD1\",\"#F46D43\",\"#E0F3F8\",\"#A50026\",\"#FEE090\",\"#A50026\",\"#A50026\",\"#4575B4\",\"#FDAE61\",\"#313695\",\"#74ADD1\",\"#74ADD1\",\"#FDAE61\",\"#E0F3F8\",\"#FEE090\",\"#74ADD1\",\"#D73027\",\"#FDAE61\",\"#FDAE61\",\"#4575B4\",\"#D73027\",\"#E0F3F8\",\"#E0F3F8\",\"#ABD9E9\",\"#A50026\",\"#FDAE61\",\"#313695\",\"#313695\",\"#4575B4\",\"#F46D43\",\"#313695\",\"#4575B4\",\"#ABD9E9\",\"#F46D43\",\"#D73027\",\"#F46D43\",\"#ABD9E9\",\"#313695\",\"#A50026\",\"#D73027\",\"#FDAE61\",\"#4575B4\",\"#FDAE61\",\"#FDAE61\",\"#D73027\",\"#D73027\",\"#A50026\",\"#ABD9E9\",\"#A50026\",\"#313695\",\"#E0F3F8\",\"#74ADD1\",\"#FDAE61\",\"#74ADD1\",\"#313695\",\"#A50026\",\"#F46D43\",\"#D73027\",\"#ABD9E9\",\"#74ADD1\",\"#E0F3F8\",\"#F46D43\",\"#F46D43\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#74ADD1\",\"#74ADD1\",\"#FEE090\",\"#313695\",\"#4575B4\",\"#A50026\",\"#74ADD1\",\"#313695\",\"#A50026\",\"#D73027\",\"#ABD9E9\",\"#74ADD1\",\"#4575B4\",\"#A50026\",\"#FDAE61\",\"#F46D43\",\"#ABD9E9\",\"#A50026\",\"#FDAE61\",\"#FEE090\",\"#4575B4\",\"#F46D43\",\"#313695\",\"#FDAE61\",\"#74ADD1\",\"#74ADD1\",\"#313695\",\"#4575B4\",\"#74ADD1\",\"#ABD9E9\",\"#D73027\",\"#ABD9E9\",\"#E0F3F8\",\"#4575B4\",\"#4575B4\",\"#A50026\",\"#A50026\",\"#74ADD1\",\"#F46D43\",\"#E0F3F8\",\"#A50026\",\"#FEE090\",\"#A50026\",\"#A50026\",\"#4575B4\",\"#FDAE61\",\"#313695\",\"#74ADD1\",\"#74ADD1\",\"#FDAE61\",\"#E0F3F8\",\"#FEE090\",\"#74ADD1\",\"#D73027\",\"#FDAE61\",\"#FDAE61\",\"#4575B4\",\"#D73027\",\"#E0F3F8\",\"#E0F3F8\",\"#ABD9E9\",\"#A50026\",\"#FDAE61\",\"#313695\",\"#313695\",\"#4575B4\",\"#F46D43\",\"#313695\",\"#4575B4\",\"#ABD9E9\",\"#F46D43\",\"#D73027\",\"#F46D43\",\"#ABD9E9\",\"#313695\",\"#A50026\",\"#D73027\",\"#FDAE61\",\"#4575B4\",\"#FDAE61\",\"#FDAE61\",\"#D73027\",\"#D73027\",\"#A50026\",\"#ABD9E9\",\"#A50026\",\"#313695\",\"#E0F3F8\",\"#74ADD1\",\"#FDAE61\",\"#74ADD1\",\"#313695\",\"#A50026\",\"#F46D43\",\"#D73027\",\"#ABD9E9\",\"#74ADD1\",\"#E0F3F8\",\"#F46D43\",\"#F46D43\"],\"fillOpacity\":0.5},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00071745929274,42.05096668795214],\"lng\":[-93.67166005687031,-93.62333999274722]}},\"evals\":[],\"jsHooks\":[]} # Continuous colors using the \"Greens\" colorbrewer palette, mapped to value greens <- colorNumeric(\"Greens\", domain = NULL) m %>% addCircleMarkers(~lng, ~lat, radius = ~size, color = ~greens(value), fillOpacity = 0.5) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.0275439469367,42.02850856687817,42.02471710192324,42.03856490439633,42.02617552024589,42.02185988769047,42.03201242237268,42.02156836879088,42.00071745929274,42.03982404542268,42.01845138245503,42.0145462442034,42.02713285607175,42.03331993717762,42.03942914269688,42.01528218729826,42.03905582360974,42.02689046633677,42.02676699091157,42.02558251597001,42.05096668795214,42.032210951063,42.04086263070892,42.03730671421407,42.03781360320225,42.04218406398204,42.01310542696795,42.02988470783713,42.01024712620395,42.0395379742443,42.03621371549353,42.03759148573567,42.03239579190152,42.03092304970755,42.04000764170451,42.02385331692301,42.00497694162157,42.03345846489503,42.01822184158728,42.03690247746567,42.03492905051364,42.02329699643625,42.02304686530763,42.02930893183068,42.02481924587406,42.03304851136662,42.02572835523341,42.03253167147148,42.02858137871883,42.02493229196173,42.03344554007207,42.03885993007018,42.03453662331968,42.02896697574077,42.03440326830454,42.03153373039122,42.02998154371434,42.03839726794725,42.03000786056483,42.03228592948875,42.02456909646138,42.02140617683165,42.00931476024424,42.02776970753985,42.02058487732943,42.0385882223591,42.04442791183199,42.04104362241481,42.04056039863206,42.01900940574943,42.01885203526652,42.02791607640876,42.02520478385033,42.01998555810211,42.02348692232571,42.03493010366306,42.04210181811401,42.04162838622378,42.03574990755181,42.02649813426255,42.01902732870672,42.03661389540903,42.03338205254317,42.04880992805718,42.02644902111552,42.0189870196251,42.02529985536037,42.02837619205334,42.02666159607317,42.02036268722185,42.03696162266866,42.02001938132206,42.01869179289501,42.02566274377212,42.02701611639693,42.02177488465831,42.00592651448041,42.01909304157013,42.04922120754906,42.04439288395704],[-93.65154106959666,-93.65042599433595,-93.64894673668371,-93.63344615385955,-93.63650336381714,-93.63517834446287,-93.64096087565615,-93.64302240137884,-93.65970980766507,-93.65687336519353,-93.63750827942931,-93.65715438538916,-93.65581264211097,-93.66183094827997,-93.63497000238645,-93.64647378446301,-93.66227304439663,-93.66231158252228,-93.63462596707021,-93.67166005687031,-93.65953665273665,-93.64667494147291,-93.65194310671578,-93.66681968743772,-93.64116057253251,-93.64648118079009,-93.63293680687235,-93.65716902451619,-93.650088528175,-93.64820570997722,-93.65227400111098,-93.66010783848354,-93.63607970518663,-93.66379373439912,-93.63726328503033,-93.64591334734048,-93.64174706139255,-93.66316505474174,-93.64177490738993,-93.66619049960109,-93.62887364851633,-93.65925649568541,-93.64788636448064,-93.64622272894798,-93.6518088328543,-93.65642877993822,-93.65277725735886,-93.64884517690669,-93.65184949503832,-93.64688277651398,-93.62613467529516,-93.64344530962872,-93.6400142173333,-93.65649160597073,-93.65821816491015,-93.6450216957919,-93.66065500857943,-93.6496534930058,-93.64968006901142,-93.6395620322087,-93.6337064729676,-93.64244565472642,-93.64586421466817,-93.6688970531778,-93.65993756207125,-93.65539459897117,-93.65447746537514,-93.65931811321661,-93.63796320755306,-93.65121637545339,-93.6592965222663,-93.66875134637795,-93.66011924371401,-93.63659854208248,-93.62875245353796,-93.64266145297552,-93.65150969656609,-93.65252449240651,-93.63608640530559,-93.63169024927461,-93.64547683408794,-93.65741258045203,-93.66363223553533,-93.66288777620294,-93.62333999274722,-93.66239924451044,-93.65272895570001,-93.65522995481368,-93.65917870381627,-93.64153418079768,-93.64948539942503,-93.64873546796603,-93.64148059835311,-93.64484782706499,-93.63986774654656,-93.65436875099033,-93.64883541549075,-93.66166696709044,-93.66897040761957,-93.63764228488199],[8.077534276526421,5.485966079868376,9.649251458467916,5.896341383922845,13.26696534990333,12.514092217898,12.29106032173149,18.93870580708608,8.804657576838508,8.276547340210527,9.784943790873513,16.39211874105968,17.48959766933694,16.3546313601546,14.61338578956202,17.36487112939358,5.151420767651871,19.93330998811871,18.70117642451078,6.046578008681536,5.429585756501183,12.94646361959167,8.967910417122766,8.912540099117905,7.946839884389192,13.1862185022328,7.331444468582049,16.58711979631335,8.081714907893911,6.975217631552368,18.13800857053138,14.50175033998676,18.07911640731618,13.24625853914768,11.25593722099438,14.33360313181765,19.04103419394232,14.9766163143795,17.760249665007,6.531758917262778,14.75548244081438,17.11697243154049,10.14644648763351,12.35893932403997,10.26048175990582,16.11323629971594,17.23661144962534,18.3672665792983,14.90982936578803,6.503005982376635,8.385817388771102,11.45169689785689,7.563369501149282,18.12055895337835,10.99375160061754,13.13556855777279,17.67581826192327,17.80606510932557,19.31105108582415,12.879789135186,6.506128339096904,16.64688466582447,8.409437106456608,9.197224682429805,15.82827810314484,8.035586961777881,10.49104926991276,7.545773686142638,12.67594884266146,15.2026745735202,14.41742338938639,18.97705871029757,6.06701691634953,17.0168387517333,7.916135370032862,11.9601853156928,6.649805206106976,8.35004405467771,17.84352153656073,10.04383708699606,10.13097612769343,6.979987706290558,11.03796194889583,6.272663669660687,17.01876444858499,9.816488409414887,10.5149889702443,8.390462450915948,13.3317927562166,10.12469277367927,10.43406123411842,13.55476253200322,19.73118214984424,17.61772529222071,16.42703348537907,13.19420637912117,12.21818620804697,5.498720001196489,17.84487215452828,10.7387919316534],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":[\"#95D391\",\"#005120\",\"#58B668\",\"#93D28F\",\"#218843\",\"#9BD696\",\"#30984E\",\"#D9F0D3\",\"#D7EFD1\",\"#137B37\",\"#0C7533\",\"#72C375\",\"#369F54\",\"#349D52\",\"#BAE3B3\",\"#CEECC8\",\"#54B365\",\"#39A257\",\"#3AA357\",\"#3BA458\",\"#00441B\",\"#89CE87\",\"#69BE70\",\"#349C52\",\"#E7F6E2\",\"#6CC072\",\"#37A055\",\"#1E8540\",\"#77C578\",\"#91D28E\",\"#31994F\",\"#3EA85B\",\"#228944\",\"#43AC5E\",\"#77C679\",\"#005020\",\"#5AB769\",\"#E4F4DF\",\"#77C578\",\"#117936\",\"#258D46\",\"#3AA357\",\"#75C577\",\"#AFDFA8\",\"#0E7634\",\"#72C375\",\"#88CD86\",\"#3CA559\",\"#0D7633\",\"#72C375\",\"#137B38\",\"#289049\",\"#9ED899\",\"#7EC97E\",\"#41AB5D\",\"#F7FCF5\",\"#A0D99A\",\"#64BC6E\",\"#30984F\",\"#228A44\",\"#319A50\",\"#CAEAC3\",\"#5CB86A\",\"#005C25\",\"#A7DCA1\",\"#58B567\",\"#41AB5D\",\"#91D28E\",\"#ADDEA7\",\"#289049\",\"#05712F\",\"#A8DCA2\",\"#C6E9BF\",\"#90D18D\",\"#7BC77B\",\"#C0E6B9\",\"#D3EECD\",\"#77C679\",\"#B3E0AC\",\"#C6E9BF\",\"#349D52\",\"#A4DA9E\",\"#258D47\",\"#3DA75A\",\"#117A36\",\"#005E26\",\"#4CB062\",\"#45AD5F\",\"#84CB83\",\"#7BC77B\",\"#3FA95C\",\"#C6E8BF\",\"#75C477\",\"#DFF2D9\",\"#278F48\",\"#A4DA9D\",\"#127A37\",\"#369E54\",\"#B7E2B0\",\"#69BE70\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#95D391\",\"#005120\",\"#58B668\",\"#93D28F\",\"#218843\",\"#9BD696\",\"#30984E\",\"#D9F0D3\",\"#D7EFD1\",\"#137B37\",\"#0C7533\",\"#72C375\",\"#369F54\",\"#349D52\",\"#BAE3B3\",\"#CEECC8\",\"#54B365\",\"#39A257\",\"#3AA357\",\"#3BA458\",\"#00441B\",\"#89CE87\",\"#69BE70\",\"#349C52\",\"#E7F6E2\",\"#6CC072\",\"#37A055\",\"#1E8540\",\"#77C578\",\"#91D28E\",\"#31994F\",\"#3EA85B\",\"#228944\",\"#43AC5E\",\"#77C679\",\"#005020\",\"#5AB769\",\"#E4F4DF\",\"#77C578\",\"#117936\",\"#258D46\",\"#3AA357\",\"#75C577\",\"#AFDFA8\",\"#0E7634\",\"#72C375\",\"#88CD86\",\"#3CA559\",\"#0D7633\",\"#72C375\",\"#137B38\",\"#289049\",\"#9ED899\",\"#7EC97E\",\"#41AB5D\",\"#F7FCF5\",\"#A0D99A\",\"#64BC6E\",\"#30984F\",\"#228A44\",\"#319A50\",\"#CAEAC3\",\"#5CB86A\",\"#005C25\",\"#A7DCA1\",\"#58B567\",\"#41AB5D\",\"#91D28E\",\"#ADDEA7\",\"#289049\",\"#05712F\",\"#A8DCA2\",\"#C6E9BF\",\"#90D18D\",\"#7BC77B\",\"#C0E6B9\",\"#D3EECD\",\"#77C679\",\"#B3E0AC\",\"#C6E9BF\",\"#349D52\",\"#A4DA9E\",\"#258D47\",\"#3DA75A\",\"#117A36\",\"#005E26\",\"#4CB062\",\"#45AD5F\",\"#84CB83\",\"#7BC77B\",\"#3FA95C\",\"#C6E8BF\",\"#75C477\",\"#DFF2D9\",\"#278F48\",\"#A4DA9D\",\"#127A37\",\"#369E54\",\"#B7E2B0\",\"#69BE70\"],\"fillOpacity\":0.5},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00071745929274,42.05096668795214],\"lng\":[-93.67166005687031,-93.62333999274722]}},\"evals\":[],\"jsHooks\":[]} # }"},{"path":"https://rstudio.github.io/leaflet/reference/leafletDependencies.html","id":null,"dir":"Reference","previous_headings":"","what":"Various leaflet dependency functions for use in downstream packages — leafletDependencies","title":"Various leaflet dependency functions for use in downstream packages — leafletDependencies","text":"Various leaflet dependency functions use downstream packages","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletDependencies.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Various leaflet dependency functions for use in downstream packages — leafletDependencies","text":"","code":"leafletDependencies"},{"path":"https://rstudio.github.io/leaflet/reference/leafletDependencies.html","id":"format","dir":"Reference","previous_headings":"","what":"Format","title":"Various leaflet dependency functions for use in downstream packages — leafletDependencies","text":"object class list length 13.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletDependencies.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Various leaflet dependency functions for use in downstream packages — leafletDependencies","text":"","code":"if (FALSE) { # \\dontrun{ addBootStrap <- function(map) { map$dependencies <- c(map$dependencies, leafletDependencies$bootstrap()) map } } # }"},{"path":"https://rstudio.github.io/leaflet/reference/leafletProxy.html","id":null,"dir":"Reference","previous_headings":"","what":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","title":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","text":"Creates map-like object can used customize control map already rendered. use Shiny apps Shiny docs .","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletProxy.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","text":"","code":"leafletProxy( mapId, session = shiny::getDefaultReactiveDomain(), data = NULL, deferUntilFlush = TRUE )"},{"path":"https://rstudio.github.io/leaflet/reference/leafletProxy.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","text":"mapId single-element character vector indicating output ID map modify (invoked Shiny module, namespace added automatically) session Shiny session object map belongs; usually default value suffice data data object; see Details leaflet() help topic deferUntilFlush indicates whether actions performed instance carried right away, whether held next time outputs updated; defaults TRUE","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletProxy.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","text":"Normally, create Leaflet map using leaflet(). creates -memory representation map can customize using functions like addPolygons() setView(). map can printed R console, included R Markdown document, rendered Shiny output. case Shiny, may want customize map, even rendered output. point, -memory representation map long gone, user's web browser already realized Leaflet map instance. leafletProxy() comes . returns object can stand usual Leaflet map object. usual map functions like addPolygons() setView() can called, instead customizing -memory representation, commands execute live Leaflet map instance.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletProxy.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","text":"","code":"library(shiny) ui <- fluidPage( leafletOutput(\"map1\") ) map <- leaflet() %>% addCircleMarkers( lng = runif(10), lat = runif(10), layerId = paste0(\"marker\", 1:10)) server <- function(input, output, session) { output$map1 <- renderLeaflet(map) observeEvent(input$map1_marker_click, { leafletProxy(\"map1\", session) %>% removeMarker(input$map1_marker_click$id) }) } app <- shinyApp(ui, server) if (interactive()) app"},{"path":"https://rstudio.github.io/leaflet/reference/leafletSizingPolicy.html","id":null,"dir":"Reference","previous_headings":"","what":"Leaflet sizing policy — leafletSizingPolicy","title":"Leaflet sizing policy — leafletSizingPolicy","text":"Sizing policy used withing leaflet htmlwidgets.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletSizingPolicy.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Leaflet sizing policy — leafletSizingPolicy","text":"","code":"leafletSizingPolicy( defaultWidth = \"100%\", defaultHeight = 400, padding = 0, browser.fill = TRUE, ... )"},{"path":"https://rstudio.github.io/leaflet/reference/leafletSizingPolicy.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Leaflet sizing policy — leafletSizingPolicy","text":"defaultWidth defaults \"100%\" available width defaultHeight defaults 400px tall padding defaults 0px browser.fill defaults TRUE ... Arguments passed htmlwidgets::sizingPolicy viewer.defaultWidth default width used display widget within RStudio Viewer. viewer.defaultHeight default height used display widget within RStudio Viewer. viewer.padding Padding around widget displayed RStudio Viewer (defaults 15 pixels). viewer.fill displayed RStudio Viewer, automatically size widget viewer dimensions (note viewer.padding still applied). Default TRUE. viewer.suppress Never display widget within RStudio Viewer (useful widgets require large amount space rendering). Defaults FALSE. viewer.paneHeight Request RStudio Viewer forced specific height displaying widget. browser.defaultWidth default width used display widget within standalone web browser. browser.defaultHeight default height used display widget within standalone web browser. browser.padding Padding around widget displayed standalone browser (defaults 40 pixels). browser.external displaying browser, always use external browser (via browseURL()). Defaults `FALSE“, result use internal browser within RStudio v1.1 higher. knitr.defaultWidth default width used display widget within documents generated knitr (e.g. R Markdown). knitr.defaultHeight default height used display widget within documents generated knitr (e.g. R Markdown). knitr.figure Apply default knitr fig.width fig.height widget rendered within R Markdown documents. Defaults TRUE. fill Whether widget's container treated fill item, meaning height allowed grow/shrink fit fill container opinionated height (see htmltools::bindFillRole() ). Examples fill containers include bslib::card() bslib::card_body_fill().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletSizingPolicy.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Leaflet sizing policy — leafletSizingPolicy","text":"htmlwidgets::sizingPolicy object","code":""},{"path":"https://rstudio.github.io/leaflet/reference/makeAwesomeIcon.html","id":null,"dir":"Reference","previous_headings":"","what":"Make Awesome Icon — makeAwesomeIcon","title":"Make Awesome Icon — makeAwesomeIcon","text":"Make Awesome Icon","code":""},{"path":"https://rstudio.github.io/leaflet/reference/makeAwesomeIcon.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Make Awesome Icon — makeAwesomeIcon","text":"","code":"makeAwesomeIcon( icon = \"home\", library = \"glyphicon\", markerColor = \"blue\", iconColor = \"white\", spin = FALSE, extraClasses = NULL, squareMarker = FALSE, iconRotate = 0, fontFamily = \"monospace\", text = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/makeAwesomeIcon.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Make Awesome Icon — makeAwesomeIcon","text":"icon Name icon library icon library. Default \"glyphicon\", possible values \"fa\" (fontawesome) \"ion\" (ionicons). markerColor Possible values \"red\", \"darkred\", \"lightred\", \"orange\", \"beige\", \"green\", \"darkgreen\", \"lightgreen\", \"blue\", \"darkblue\", \"lightblue\", \"purple\", \"darkpurple\", \"pink\", \"cadetblue\", \"white\", \"gray\", \"lightgray\", \"black\" iconColor color use icon . Use CSS-valid color (hex, rgba, etc.) named web color. spin TRUE, make icon spin (works library = \"fa\") extraClasses Additional css classes include icon. squareMarker Whether use square marker. iconRotate Rotate icon given angle. fontFamily Used text option specified. text Use text string instead icon. Argument addAwesomeMarkers().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/makeIcon.html","id":null,"dir":"Reference","previous_headings":"","what":"Define icon sets — makeIcon","title":"Define icon sets — makeIcon","text":"Define icon sets","code":""},{"path":"https://rstudio.github.io/leaflet/reference/makeIcon.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Define icon sets — makeIcon","text":"","code":"makeIcon( iconUrl = NULL, iconRetinaUrl = NULL, iconWidth = NULL, iconHeight = NULL, iconAnchorX = NULL, iconAnchorY = NULL, shadowUrl = NULL, shadowRetinaUrl = NULL, shadowWidth = NULL, shadowHeight = NULL, shadowAnchorX = NULL, shadowAnchorY = NULL, popupAnchorX = NULL, popupAnchorY = NULL, className = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/makeIcon.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Define icon sets — makeIcon","text":"iconUrl URL file path icon image iconRetinaUrl URL file path retina sized version icon image iconWidth, iconHeight size icon image pixels iconAnchorX, iconAnchorY coordinates \"tip\" icon (relative top left corner, .e., top left corner means iconAnchorX = 0 iconAnchorY = 0), icon aligned point marker's geographical location shadowUrl URL file path icon shadow image shadowRetinaUrl URL file path retina sized version icon shadow image shadowWidth, shadowHeight size shadow image pixels shadowAnchorX, shadowAnchorY coordinates \"tip\" shadow popupAnchorX, popupAnchorY coordinates point popups \"open\", relative icon anchor className custom class name assign icon shadow images","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":null,"dir":"Reference","previous_headings":"","what":"Graphics elements and layers — addControl","title":"Graphics elements and layers — addControl","text":"Add graphics elements layers map widget.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Graphics elements and layers — addControl","text":"","code":"addControl( map, html, position = c(\"topleft\", \"topright\", \"bottomleft\", \"bottomright\"), layerId = NULL, className = \"info legend\", data = getMapData(map) ) addTiles( map, urlTemplate = \"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\", attribution = NULL, layerId = NULL, group = NULL, options = tileOptions(), data = getMapData(map) ) addWMSTiles( map, baseUrl, layerId = NULL, group = NULL, options = WMSTileOptions(), attribution = NULL, layers = \"\", data = getMapData(map) ) addPopups( map, lng = NULL, lat = NULL, popup, layerId = NULL, group = NULL, options = popupOptions(), data = getMapData(map) ) addMarkers( map, lng = NULL, lat = NULL, layerId = NULL, group = NULL, icon = NULL, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = markerOptions(), clusterOptions = NULL, clusterId = NULL, data = getMapData(map) ) addLabelOnlyMarkers( map, lng = NULL, lat = NULL, layerId = NULL, group = NULL, icon = NULL, label = NULL, labelOptions = NULL, options = markerOptions(), clusterOptions = NULL, clusterId = NULL, data = getMapData(map) ) addCircleMarkers( map, lng = NULL, lat = NULL, radius = 10, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = pathOptions(), clusterOptions = NULL, clusterId = NULL, data = getMapData(map) ) highlightOptions( stroke = NULL, color = NULL, weight = NULL, opacity = NULL, fill = NULL, fillColor = NULL, fillOpacity = NULL, dashArray = NULL, bringToFront = NULL, sendToBack = NULL ) addCircles( map, lng = NULL, lat = NULL, radius = 10, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = pathOptions(), highlightOptions = NULL, data = getMapData(map) ) addPolylines( map, lng = NULL, lat = NULL, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = FALSE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, smoothFactor = 1, noClip = FALSE, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = pathOptions(), highlightOptions = NULL, data = getMapData(map) ) addRectangles( map, lng1, lat1, lng2, lat2, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, smoothFactor = 1, noClip = FALSE, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = pathOptions(), highlightOptions = NULL, data = getMapData(map) ) addPolygons( map, lng = NULL, lat = NULL, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, smoothFactor = 1, noClip = FALSE, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = pathOptions(), highlightOptions = NULL, data = getMapData(map) ) addGeoJSON( map, geojson, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, smoothFactor = 1, noClip = FALSE, options = pathOptions(), data = getMapData(map) ) addTopoJSON( map, topojson, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, smoothFactor = 1, noClip = FALSE, options = pathOptions() )"},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Graphics elements and layers — addControl","text":"map map widget object created leaflet() html content control. May provided string HTML generated Shiny/htmltools tags position position control: \"topleft\", \"topright\", \"bottomleft\", \"bottomright\". layerId layer id className extra CSS classes append control, space separated data data object argument values derived; default, data object provided leaflet() initially, can overridden urlTemplate character string URL template attribution attribution text tile layer (HTML) group name group newly created layers belong (clearGroup() addLayersControl() purposes). Human-friendly group names permitted–need short, identifier-style names. number layers even different types layers (e.g., markers polygons) can share group name. options list extra options tile layers, popups, paths (circles, rectangles, polygons, ...), map elements baseUrl base URL WMS service layers comma-separated list WMS layers show lng numeric vector longitudes, one-sided formula form ~x x variable data; default (explicitly provided), automatically inferred data looking column named lng, long, longitude (case-insensitively) lat vector latitudes formula (similar lng argument; names lat latitude used guessing latitude column data) popup character vector HTML content popups (recommended escape text using htmltools::htmlEscape() security reasons) icon icon(s) markers; icon represented R list form list(iconUrl = \"?\", iconSize = c(x, y)), can use icons() create multiple icons; note use R list contains images local files, local image files base64 encoded HTML page icon images still available even publish map elsewhere popupOptions Vector popupOptions() provide popups label character vector HTML content labels labelOptions Vector labelOptions() provide label options label. Default NULL clusterOptions NULL, markers clustered using Leaflet.markercluster; can use markerClusterOptions() specify marker cluster options clusterId id marker cluster layer radius numeric vector radii circles; can also one-sided formula, case radius values derived data (units meters circles, pixels circle markers) stroke whether draw stroke along path (e.g., borders polygons circles) color stroke color weight stroke width pixels opacity stroke opacity (layer opacity tile layers) fill whether fill path color (e.g., filling polygons circles) fillColor fill color fillOpacity fill opacity dashArray string defines stroke dash pattern bringToFront Whether shape brought front hover. sendToBack whether shape sent back mouse . highlightOptions Options highlighting shape mouse . smoothFactor much simplify polyline zoom level (means better performance less accurate representation) noClip whether disable polyline clipping lng1, lat1, lng2, lat2 latitudes longitudes south-west north-east corners rectangles geojson GeoJSON list, character vector length 1 topojson TopoJSON list, character vector length 1","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Graphics elements and layers — addControl","text":"new map object","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":"functions","dir":"Reference","previous_headings":"","what":"Functions","title":"Graphics elements and layers — addControl","text":"addControl(): Add arbitrary HTML controls map addTiles(): Add tile layer map addWMSTiles(): Add WMS tile layer map addPopups(): Add popups map addMarkers(): Add markers map addLabelOnlyMarkers(): Add Label markers map addCircleMarkers(): Add circle markers map highlightOptions(): Options highlight shape hover addCircles(): Add circles map addPolylines(): Add polylines map addRectangles(): Add rectangles map addPolygons(): Add polygons map addGeoJSON(): Add GeoJSON layers map addTopoJSON(): Add TopoJSON layers map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":"references","dir":"Reference","previous_headings":"","what":"References","title":"Graphics elements and layers — addControl","text":"Leaflet API documentation: https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":null,"dir":"Reference","previous_headings":"","what":"Methods to manipulate the map widget — setView","title":"Methods to manipulate the map widget — setView","text":"series methods manipulate map.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Methods to manipulate the map widget — setView","text":"","code":"setView(map, lng, lat, zoom, options = list()) flyTo(map, lng, lat, zoom, options = list()) fitBounds(map, lng1, lat1, lng2, lat2, options = list()) flyToBounds(map, lng1, lat1, lng2, lat2, options = list()) setMaxBounds(map, lng1, lat1, lng2, lat2) clearBounds(map)"},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Methods to manipulate the map widget — setView","text":"map map widget object created leaflet() lng longitude map center lat latitude map center zoom zoom level options list zoom/pan options (see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#zoom/pan-options) lng1, lat1, lng2, lat2 coordinates map bounds","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Methods to manipulate the map widget — setView","text":"modified map widget.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"functions","dir":"Reference","previous_headings":"","what":"Functions","title":"Methods to manipulate the map widget — setView","text":"setView(): Set view map (center zoom level) flyTo(): Flys given location/zoom-level using smooth pan-zoom. fitBounds(): Set bounds map flyToBounds(): Flys given bound using smooth pan/zoom. setMaxBounds(): Restricts map view given bounds clearBounds(): Clear bounds map, bounds automatically determined latitudes longitudes map elements available (otherwise full world view used)","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"references","dir":"Reference","previous_headings":"","what":"References","title":"Methods to manipulate the map widget — setView","text":"https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#map-methods--modifying-map-state","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Methods to manipulate the map widget — setView","text":"","code":"m <- leaflet() %>% addTiles() %>% setView(-71.0382679, 42.3489054, zoom = 18) m # the RStudio 'headquarter' {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}],\"setView\":[[42.3489054,-71.03826789999999],18,[]]},\"evals\":[],\"jsHooks\":[]}m %>% fitBounds(-72, 40, -70, 43) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}],\"fitBounds\":[40,-72,43,-70,[]]},\"evals\":[],\"jsHooks\":[]}m %>% clearBounds() # world view {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/map-options.html","id":null,"dir":"Reference","previous_headings":"","what":"Extra options for map elements and layers — tileOptions","title":"Extra options for map elements and layers — tileOptions","text":"rest possible options map elements layers listed layer functions.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-options.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Extra options for map elements and layers — tileOptions","text":"","code":"tileOptions( minZoom = 0, maxZoom = 18, maxNativeZoom = NULL, tileSize = 256, subdomains = \"abc\", errorTileUrl = \"\", tms = FALSE, noWrap = FALSE, zoomOffset = 0, zoomReverse = FALSE, opacity = 1, zIndex = 1, unloadInvisibleTiles = NULL, updateWhenIdle = NULL, detectRetina = FALSE, ... ) gridOptions( tileSize = 256, updateWhenIdle = NULL, zIndex = 1, minZoom = 0, maxZoom = NULL, ... ) WMSTileOptions( styles = \"\", format = \"image/jpeg\", transparent = FALSE, version = \"1.1.1\", crs = NULL, ... ) popupOptions( maxWidth = 300, minWidth = 50, maxHeight = NULL, autoPan = TRUE, keepInView = FALSE, closeButton = TRUE, zoomAnimation = NULL, closeOnClick = NULL, className = \"\", ... ) labelOptions( interactive = FALSE, clickable = NULL, noHide = NULL, permanent = FALSE, className = \"\", direction = \"auto\", offset = c(0, 0), opacity = 1, textsize = \"10px\", textOnly = FALSE, style = NULL, zoomAnimation = NULL, sticky = TRUE, ... ) markerOptions( interactive = TRUE, clickable = NULL, draggable = FALSE, keyboard = TRUE, title = \"\", alt = \"\", zIndexOffset = 0, opacity = 1, riseOnHover = FALSE, riseOffset = 250, ... ) markerClusterOptions( showCoverageOnHover = TRUE, zoomToBoundsOnClick = TRUE, spiderfyOnMaxZoom = TRUE, removeOutsideVisibleBounds = TRUE, spiderLegPolylineOptions = list(weight = 1.5, color = \"#222\", opacity = 0.5), freezeAtZoom = FALSE, ... ) pathOptions( lineCap = NULL, lineJoin = NULL, clickable = NULL, interactive = TRUE, pointerEvents = NULL, className = \"\", ... )"},{"path":"https://rstudio.github.io/leaflet/reference/map-options.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Extra options for map elements and layers — tileOptions","text":"minZoom, maxZoom, maxNativeZoom, tileSize, subdomains, errorTileUrl, tms, noWrap, zoomOffset, zoomReverse, zIndex, unloadInvisibleTiles, updateWhenIdle, detectRetina tile layer options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tilelayer opacity Tooltip container opacity. Ranges 0 1. Default value 1 (different leaflet.js 0.9); see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tooltip-opacity ... extra options passed underlying JavaScript object constructor. styles comma-separated list WMS styles format WMS image format (use \"image/png\" layers transparency) transparent TRUE, WMS service return images transparency version version WMS service use crs Coordinate Reference System use WMS requests, defaults. maxWidth, minWidth, maxHeight, autoPan, keepInView, closeButton, closeOnClick popup options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#popup-option zoomAnimation deprecated. See https://github.com/Leaflet/Leaflet/blob/master/CHANGELOG.md#api-changes-5 className CSS class name set element interactive whether element emits mouse events clickable DEPRECATED! Use interactive argument. noHide, direction, offset, permanent label options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tooltip-option textsize Change text size single tooltip textOnly Display text, regular surrounding box. style list css style added tooltip sticky true, tooltip follow mouse instead fixed feature center. Default value TRUE (different leaflet.js FALSE); see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tooltip-sticky draggable, keyboard, title, alt, zIndexOffset, riseOnHover, riseOffset marker options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#marker-option showCoverageOnHover mouse cluster shows bounds markers zoomToBoundsOnClick click cluster zoom bounds spiderfyOnMaxZoom click cluster bottom zoom level spiderfy can see markers removeOutsideVisibleBounds clusters markers far viewport removed map performance spiderLegPolylineOptions Allows specify PolylineOptions style spider legs. default, {weight: 1.5, color: \"#222\", opacity: 0.5 }. freezeAtZoom Allows freeze cluster expansion zoom level. Can zoom level e.g., 10, 12 \"max\" \"maxKeepSpiderify\". See https://github.com/ghybs/Leaflet.MarkerCluster.Freezable#api-reference. lineCap string defines shape used end stroke. lineJoin string defines shape used corners stroke. pointerEvents sets pointer-events attribute path SVG backend used","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-options.html","id":"functions","dir":"Reference","previous_headings":"","what":"Functions","title":"Extra options for map elements and layers — tileOptions","text":"tileOptions(): Options tile layers gridOptions(): Options grid layers WMSTileOptions(): Options WMS tile layers popupOptions(): Options popups labelOptions(): Options labels markerOptions(): Options markers markerClusterOptions(): Options marker clusters pathOptions(): Options vector layers (polylines, polygons, rectangles, circles, etc)","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/map-shiny.html","id":null,"dir":"Reference","previous_headings":"","what":"Wrapper functions for using leaflet in shiny — leafletOutput","title":"Wrapper functions for using leaflet in shiny — leafletOutput","text":"Use leafletOutput() create UI element, renderLeaflet() render map widget.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-shiny.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Wrapper functions for using leaflet in shiny — leafletOutput","text":"","code":"leafletOutput(outputId, width = \"100%\", height = 400) renderLeaflet(expr, env = parent.frame(), quoted = FALSE)"},{"path":"https://rstudio.github.io/leaflet/reference/map-shiny.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Wrapper functions for using leaflet in shiny — leafletOutput","text":"outputId output variable read width, height width height map (see htmlwidgets::shinyWidgetOutput()) expr expression generates HTML widget (promise HTML widget). env environment evaluate expr. quoted expr quoted expression (quote())? useful want save expression variable.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-shiny.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Wrapper functions for using leaflet in shiny — leafletOutput","text":"","code":"# !formatR library(shiny) app <- shinyApp( ui = fluidPage(leafletOutput('myMap')), server = function(input, output) { map = leaflet() %>% addTiles() %>% setView(-93.65, 42.0285, zoom = 17) output$myMap = renderLeaflet(map) } ) if (interactive()) app"},{"path":"https://rstudio.github.io/leaflet/reference/mapOptions.html","id":null,"dir":"Reference","previous_headings":"","what":"Set options on a leaflet map object — mapOptions","title":"Set options on a leaflet map object — mapOptions","text":"Set options leaflet map object","code":""},{"path":"https://rstudio.github.io/leaflet/reference/mapOptions.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Set options on a leaflet map object — mapOptions","text":"","code":"mapOptions(map, zoomToLimits = c(\"always\", \"first\", \"never\"))"},{"path":"https://rstudio.github.io/leaflet/reference/mapOptions.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Set options on a leaflet map object — mapOptions","text":"map map widget object created leaflet() zoomToLimits Controls whether map zooms limits elements map. useful interactive applications map data updated. \"always\" (default), map always re-zooms new data received; \"first\", zooms elements first rendering, re-zoom subsequent data; \"never\", never re-zooms, even first rendering.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/mapOptions.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Set options on a leaflet map object — mapOptions","text":"","code":"# Don't auto-zoom to the objects (can be useful in interactive applications) leaflet() %>% addTiles() %>% addPopups(174.7690922, -36.8523071, \"R was born here!\") %>% mapOptions(zoomToLimits = \"first\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}},\"zoomToLimits\":\"first\"},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addPopups\",\"args\":[-36.8523071,174.7690922,\"R was born here!\",null,null,{\"maxWidth\":300,\"minWidth\":50,\"autoPan\":true,\"keepInView\":false,\"closeButton\":true,\"className\":\"\"}]}],\"limits\":{\"lat\":[-36.8523071,-36.8523071],\"lng\":[174.7690922,174.7690922]}},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/previewColors.html","id":null,"dir":"Reference","previous_headings":"","what":"Color previewing utility — previewColors","title":"Color previewing utility — previewColors","text":"Color previewing utility","code":""},{"path":"https://rstudio.github.io/leaflet/reference/previewColors.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Color previewing utility — previewColors","text":"","code":"previewColors(pal, values)"},{"path":"https://rstudio.github.io/leaflet/reference/previewColors.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Color previewing utility — previewColors","text":"pal color mapping function, like returned colorNumeric(), et al values set values preview colors ","code":""},{"path":"https://rstudio.github.io/leaflet/reference/previewColors.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Color previewing utility — previewColors","text":"HTML-based list colors values","code":""},{"path":"https://rstudio.github.io/leaflet/reference/providers.html","id":null,"dir":"Reference","previous_headings":"","what":"Providers — providers","title":"Providers — providers","text":"List providers variations","code":""},{"path":"https://rstudio.github.io/leaflet/reference/providers.html","id":"format","dir":"Reference","previous_headings":"","what":"Format","title":"Providers — providers","text":"list characters","code":""},{"path":"https://rstudio.github.io/leaflet/reference/providers.html","id":"source","dir":"Reference","previous_headings":"","what":"Source","title":"Providers — providers","text":"https://github.com/leaflet-extras/leaflet-providers/blob/0a9e27f8c6c26956b4e78c26e1945d748e3c2869/leaflet-providers.js","code":""},{"path":"https://rstudio.github.io/leaflet/reference/providers.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Providers — providers","text":"","code":"providers #> $OpenStreetMap #> [1] \"OpenStreetMap\" #> #> $OpenStreetMap.Mapnik #> [1] \"OpenStreetMap.Mapnik\" #> #> $OpenStreetMap.DE #> [1] \"OpenStreetMap.DE\" #> #> $OpenStreetMap.CH #> [1] \"OpenStreetMap.CH\" #> #> $OpenStreetMap.France #> [1] \"OpenStreetMap.France\" #> #> $OpenStreetMap.HOT #> [1] \"OpenStreetMap.HOT\" #> #> $OpenStreetMap.BZH #> [1] \"OpenStreetMap.BZH\" #> #> $MapTilesAPI #> [1] \"MapTilesAPI\" #> #> $MapTilesAPI.OSMEnglish #> [1] \"MapTilesAPI.OSMEnglish\" #> #> $MapTilesAPI.OSMFrancais #> [1] \"MapTilesAPI.OSMFrancais\" #> #> $MapTilesAPI.OSMEspagnol #> [1] \"MapTilesAPI.OSMEspagnol\" #> #> $OpenSeaMap #> [1] \"OpenSeaMap\" #> #> $OPNVKarte #> [1] \"OPNVKarte\" #> #> $OpenTopoMap #> [1] \"OpenTopoMap\" #> #> $OpenRailwayMap #> [1] \"OpenRailwayMap\" #> #> $OpenFireMap #> [1] \"OpenFireMap\" #> #> $SafeCast #> [1] \"SafeCast\" #> #> $Stadia #> [1] \"Stadia\" #> #> $Stadia.AlidadeSmooth #> [1] \"Stadia.AlidadeSmooth\" #> #> $Stadia.AlidadeSmoothDark #> [1] \"Stadia.AlidadeSmoothDark\" #> #> $Stadia.OSMBright #> [1] \"Stadia.OSMBright\" #> #> $Stadia.Outdoors #> [1] \"Stadia.Outdoors\" #> #> $Stadia.StamenToner #> [1] \"Stadia.StamenToner\" #> #> $Stadia.StamenTonerBackground #> [1] \"Stadia.StamenTonerBackground\" #> #> $Stadia.StamenTonerLines #> [1] \"Stadia.StamenTonerLines\" #> #> $Stadia.StamenTonerLabels #> [1] \"Stadia.StamenTonerLabels\" #> #> $Stadia.StamenTonerLite #> [1] \"Stadia.StamenTonerLite\" #> #> $Stadia.StamenWatercolor #> [1] \"Stadia.StamenWatercolor\" #> #> $Stadia.StamenTerrain #> [1] \"Stadia.StamenTerrain\" #> #> $Stadia.StamenTerrainBackground #> [1] \"Stadia.StamenTerrainBackground\" #> #> $Stadia.StamenTerrainLabels #> [1] \"Stadia.StamenTerrainLabels\" #> #> $Stadia.StamenTerrainLines #> [1] \"Stadia.StamenTerrainLines\" #> #> $Thunderforest #> [1] \"Thunderforest\" #> #> $Thunderforest.OpenCycleMap #> [1] \"Thunderforest.OpenCycleMap\" #> #> $Thunderforest.Transport #> [1] \"Thunderforest.Transport\" #> #> $Thunderforest.TransportDark #> [1] \"Thunderforest.TransportDark\" #> #> $Thunderforest.SpinalMap #> [1] \"Thunderforest.SpinalMap\" #> #> $Thunderforest.Landscape #> [1] \"Thunderforest.Landscape\" #> #> $Thunderforest.Outdoors #> [1] \"Thunderforest.Outdoors\" #> #> $Thunderforest.Pioneer #> [1] \"Thunderforest.Pioneer\" #> #> $Thunderforest.MobileAtlas #> [1] \"Thunderforest.MobileAtlas\" #> #> $Thunderforest.Neighbourhood #> [1] \"Thunderforest.Neighbourhood\" #> #> $CyclOSM #> [1] \"CyclOSM\" #> #> $Jawg #> [1] \"Jawg\" #> #> $Jawg.Streets #> [1] \"Jawg.Streets\" #> #> $Jawg.Terrain #> [1] \"Jawg.Terrain\" #> #> $Jawg.Sunny #> [1] \"Jawg.Sunny\" #> #> $Jawg.Dark #> [1] \"Jawg.Dark\" #> #> $Jawg.Light #> [1] \"Jawg.Light\" #> #> $Jawg.Matrix #> [1] \"Jawg.Matrix\" #> #> $MapBox #> [1] \"MapBox\" #> #> $MapTiler #> [1] \"MapTiler\" #> #> $MapTiler.Streets #> [1] \"MapTiler.Streets\" #> #> $MapTiler.Basic #> [1] \"MapTiler.Basic\" #> #> $MapTiler.Bright #> [1] \"MapTiler.Bright\" #> #> $MapTiler.Pastel #> [1] \"MapTiler.Pastel\" #> #> $MapTiler.Positron #> [1] \"MapTiler.Positron\" #> #> $MapTiler.Hybrid #> [1] \"MapTiler.Hybrid\" #> #> $MapTiler.Toner #> [1] \"MapTiler.Toner\" #> #> $MapTiler.Topo #> [1] \"MapTiler.Topo\" #> #> $MapTiler.Voyager #> [1] \"MapTiler.Voyager\" #> #> $TomTom #> [1] \"TomTom\" #> #> $TomTom.Basic #> [1] \"TomTom.Basic\" #> #> $TomTom.Hybrid #> [1] \"TomTom.Hybrid\" #> #> $TomTom.Labels #> [1] \"TomTom.Labels\" #> #> $Esri #> [1] \"Esri\" #> #> $Esri.WorldStreetMap #> [1] \"Esri.WorldStreetMap\" #> #> $Esri.DeLorme #> [1] \"Esri.DeLorme\" #> #> $Esri.WorldTopoMap #> [1] \"Esri.WorldTopoMap\" #> #> $Esri.WorldImagery #> [1] \"Esri.WorldImagery\" #> #> $Esri.WorldTerrain #> [1] \"Esri.WorldTerrain\" #> #> $Esri.WorldShadedRelief #> [1] \"Esri.WorldShadedRelief\" #> #> $Esri.WorldPhysical #> [1] \"Esri.WorldPhysical\" #> #> $Esri.OceanBasemap #> [1] \"Esri.OceanBasemap\" #> #> $Esri.NatGeoWorldMap #> [1] \"Esri.NatGeoWorldMap\" #> #> $Esri.WorldGrayCanvas #> [1] \"Esri.WorldGrayCanvas\" #> #> $OpenWeatherMap #> [1] \"OpenWeatherMap\" #> #> $OpenWeatherMap.Clouds #> [1] \"OpenWeatherMap.Clouds\" #> #> $OpenWeatherMap.CloudsClassic #> [1] \"OpenWeatherMap.CloudsClassic\" #> #> $OpenWeatherMap.Precipitation #> [1] \"OpenWeatherMap.Precipitation\" #> #> $OpenWeatherMap.PrecipitationClassic #> [1] \"OpenWeatherMap.PrecipitationClassic\" #> #> $OpenWeatherMap.Rain #> [1] \"OpenWeatherMap.Rain\" #> #> $OpenWeatherMap.RainClassic #> [1] \"OpenWeatherMap.RainClassic\" #> #> $OpenWeatherMap.Pressure #> [1] \"OpenWeatherMap.Pressure\" #> #> $OpenWeatherMap.PressureContour #> [1] \"OpenWeatherMap.PressureContour\" #> #> $OpenWeatherMap.Wind #> [1] \"OpenWeatherMap.Wind\" #> #> $OpenWeatherMap.Temperature #> [1] \"OpenWeatherMap.Temperature\" #> #> $OpenWeatherMap.Snow #> [1] \"OpenWeatherMap.Snow\" #> #> $HERE #> [1] \"HERE\" #> #> $HERE.normalDay #> [1] \"HERE.normalDay\" #> #> $HERE.normalDayCustom #> [1] \"HERE.normalDayCustom\" #> #> $HERE.normalDayGrey #> [1] \"HERE.normalDayGrey\" #> #> $HERE.normalDayMobile #> [1] \"HERE.normalDayMobile\" #> #> $HERE.normalDayGreyMobile #> [1] \"HERE.normalDayGreyMobile\" #> #> $HERE.normalDayTransit #> [1] \"HERE.normalDayTransit\" #> #> $HERE.normalDayTransitMobile #> [1] \"HERE.normalDayTransitMobile\" #> #> $HERE.normalDayTraffic #> [1] \"HERE.normalDayTraffic\" #> #> $HERE.normalNight #> [1] \"HERE.normalNight\" #> #> $HERE.normalNightMobile #> [1] \"HERE.normalNightMobile\" #> #> $HERE.normalNightGrey #> [1] \"HERE.normalNightGrey\" #> #> $HERE.normalNightGreyMobile #> [1] \"HERE.normalNightGreyMobile\" #> #> $HERE.normalNightTransit #> [1] \"HERE.normalNightTransit\" #> #> $HERE.normalNightTransitMobile #> [1] \"HERE.normalNightTransitMobile\" #> #> $HERE.reducedDay #> [1] \"HERE.reducedDay\" #> #> $HERE.reducedNight #> [1] \"HERE.reducedNight\" #> #> $HERE.basicMap #> [1] \"HERE.basicMap\" #> #> $HERE.mapLabels #> [1] \"HERE.mapLabels\" #> #> $HERE.trafficFlow #> [1] \"HERE.trafficFlow\" #> #> $HERE.carnavDayGrey #> [1] \"HERE.carnavDayGrey\" #> #> $HERE.hybridDay #> [1] \"HERE.hybridDay\" #> #> $HERE.hybridDayMobile #> [1] \"HERE.hybridDayMobile\" #> #> $HERE.hybridDayTransit #> [1] \"HERE.hybridDayTransit\" #> #> $HERE.hybridDayGrey #> [1] \"HERE.hybridDayGrey\" #> #> $HERE.hybridDayTraffic #> [1] \"HERE.hybridDayTraffic\" #> #> $HERE.pedestrianDay #> [1] \"HERE.pedestrianDay\" #> #> $HERE.pedestrianNight #> [1] \"HERE.pedestrianNight\" #> #> $HERE.satelliteDay #> [1] \"HERE.satelliteDay\" #> #> $HERE.terrainDay #> [1] \"HERE.terrainDay\" #> #> $HERE.terrainDayMobile #> [1] \"HERE.terrainDayMobile\" #> #> $HEREv3 #> [1] \"HEREv3\" #> #> $HEREv3.normalDay #> [1] \"HEREv3.normalDay\" #> #> $HEREv3.normalDayCustom #> [1] \"HEREv3.normalDayCustom\" #> #> $HEREv3.normalDayGrey #> [1] \"HEREv3.normalDayGrey\" #> #> $HEREv3.normalDayMobile #> [1] \"HEREv3.normalDayMobile\" #> #> $HEREv3.normalDayGreyMobile #> [1] \"HEREv3.normalDayGreyMobile\" #> #> $HEREv3.normalDayTransit #> [1] \"HEREv3.normalDayTransit\" #> #> $HEREv3.normalDayTransitMobile #> [1] \"HEREv3.normalDayTransitMobile\" #> #> $HEREv3.normalNight #> [1] \"HEREv3.normalNight\" #> #> $HEREv3.normalNightMobile #> [1] \"HEREv3.normalNightMobile\" #> #> $HEREv3.normalNightGrey #> [1] \"HEREv3.normalNightGrey\" #> #> $HEREv3.normalNightGreyMobile #> [1] \"HEREv3.normalNightGreyMobile\" #> #> $HEREv3.normalNightTransit #> [1] \"HEREv3.normalNightTransit\" #> #> $HEREv3.normalNightTransitMobile #> [1] \"HEREv3.normalNightTransitMobile\" #> #> $HEREv3.reducedDay #> [1] \"HEREv3.reducedDay\" #> #> $HEREv3.reducedNight #> [1] \"HEREv3.reducedNight\" #> #> $HEREv3.basicMap #> [1] \"HEREv3.basicMap\" #> #> $HEREv3.mapLabels #> [1] \"HEREv3.mapLabels\" #> #> $HEREv3.trafficFlow #> [1] \"HEREv3.trafficFlow\" #> #> $HEREv3.carnavDayGrey #> [1] \"HEREv3.carnavDayGrey\" #> #> $HEREv3.hybridDay #> [1] \"HEREv3.hybridDay\" #> #> $HEREv3.hybridDayMobile #> [1] \"HEREv3.hybridDayMobile\" #> #> $HEREv3.hybridDayTransit #> [1] \"HEREv3.hybridDayTransit\" #> #> $HEREv3.hybridDayGrey #> [1] \"HEREv3.hybridDayGrey\" #> #> $HEREv3.pedestrianDay #> [1] \"HEREv3.pedestrianDay\" #> #> $HEREv3.pedestrianNight #> [1] \"HEREv3.pedestrianNight\" #> #> $HEREv3.satelliteDay #> [1] \"HEREv3.satelliteDay\" #> #> $HEREv3.terrainDay #> [1] \"HEREv3.terrainDay\" #> #> $HEREv3.terrainDayMobile #> [1] \"HEREv3.terrainDayMobile\" #> #> $FreeMapSK #> [1] \"FreeMapSK\" #> #> $MtbMap #> [1] \"MtbMap\" #> #> $CartoDB #> [1] \"CartoDB\" #> #> $CartoDB.Positron #> [1] \"CartoDB.Positron\" #> #> $CartoDB.PositronNoLabels #> [1] \"CartoDB.PositronNoLabels\" #> #> $CartoDB.PositronOnlyLabels #> [1] \"CartoDB.PositronOnlyLabels\" #> #> $CartoDB.DarkMatter #> [1] \"CartoDB.DarkMatter\" #> #> $CartoDB.DarkMatterNoLabels #> [1] \"CartoDB.DarkMatterNoLabels\" #> #> $CartoDB.DarkMatterOnlyLabels #> [1] \"CartoDB.DarkMatterOnlyLabels\" #> #> $CartoDB.Voyager #> [1] \"CartoDB.Voyager\" #> #> $CartoDB.VoyagerNoLabels #> [1] \"CartoDB.VoyagerNoLabels\" #> #> $CartoDB.VoyagerOnlyLabels #> [1] \"CartoDB.VoyagerOnlyLabels\" #> #> $CartoDB.VoyagerLabelsUnder #> [1] \"CartoDB.VoyagerLabelsUnder\" #> #> $HikeBike #> [1] \"HikeBike\" #> #> $HikeBike.HikeBike #> [1] \"HikeBike.HikeBike\" #> #> $HikeBike.HillShading #> [1] \"HikeBike.HillShading\" #> #> $BasemapAT #> [1] \"BasemapAT\" #> #> $BasemapAT.basemap #> [1] \"BasemapAT.basemap\" #> #> $BasemapAT.grau #> [1] \"BasemapAT.grau\" #> #> $BasemapAT.overlay #> [1] \"BasemapAT.overlay\" #> #> $BasemapAT.terrain #> [1] \"BasemapAT.terrain\" #> #> $BasemapAT.surface #> [1] \"BasemapAT.surface\" #> #> $BasemapAT.highdpi #> [1] \"BasemapAT.highdpi\" #> #> $BasemapAT.orthofoto #> [1] \"BasemapAT.orthofoto\" #> #> $nlmaps #> [1] \"nlmaps\" #> #> $nlmaps.standaard #> [1] \"nlmaps.standaard\" #> #> $nlmaps.pastel #> [1] \"nlmaps.pastel\" #> #> $nlmaps.grijs #> [1] \"nlmaps.grijs\" #> #> $nlmaps.water #> [1] \"nlmaps.water\" #> #> $nlmaps.luchtfoto #> [1] \"nlmaps.luchtfoto\" #> #> $NASAGIBS #> [1] \"NASAGIBS\" #> #> $NASAGIBS.ModisTerraTrueColorCR #> [1] \"NASAGIBS.ModisTerraTrueColorCR\" #> #> $NASAGIBS.ModisTerraBands367CR #> [1] \"NASAGIBS.ModisTerraBands367CR\" #> #> $NASAGIBS.ViirsEarthAtNight2012 #> [1] \"NASAGIBS.ViirsEarthAtNight2012\" #> #> $NASAGIBS.ModisTerraLSTDay #> [1] \"NASAGIBS.ModisTerraLSTDay\" #> #> $NASAGIBS.ModisTerraSnowCover #> [1] \"NASAGIBS.ModisTerraSnowCover\" #> #> $NASAGIBS.ModisTerraAOD #> [1] \"NASAGIBS.ModisTerraAOD\" #> #> $NASAGIBS.ModisTerraChlorophyll #> [1] \"NASAGIBS.ModisTerraChlorophyll\" #> #> $NLS #> [1] \"NLS\" #> #> $JusticeMap #> [1] \"JusticeMap\" #> #> $JusticeMap.income #> [1] \"JusticeMap.income\" #> #> $JusticeMap.americanIndian #> [1] \"JusticeMap.americanIndian\" #> #> $JusticeMap.asian #> [1] \"JusticeMap.asian\" #> #> $JusticeMap.black #> [1] \"JusticeMap.black\" #> #> $JusticeMap.hispanic #> [1] \"JusticeMap.hispanic\" #> #> $JusticeMap.multi #> [1] \"JusticeMap.multi\" #> #> $JusticeMap.nonWhite #> [1] \"JusticeMap.nonWhite\" #> #> $JusticeMap.white #> [1] \"JusticeMap.white\" #> #> $JusticeMap.plurality #> [1] \"JusticeMap.plurality\" #> #> $GeoportailFrance #> [1] \"GeoportailFrance\" #> #> $GeoportailFrance.plan #> [1] \"GeoportailFrance.plan\" #> #> $GeoportailFrance.parcels #> [1] \"GeoportailFrance.parcels\" #> #> $GeoportailFrance.orthos #> [1] \"GeoportailFrance.orthos\" #> #> $OneMapSG #> [1] \"OneMapSG\" #> #> $OneMapSG.Default #> [1] \"OneMapSG.Default\" #> #> $OneMapSG.Night #> [1] \"OneMapSG.Night\" #> #> $OneMapSG.Original #> [1] \"OneMapSG.Original\" #> #> $OneMapSG.Grey #> [1] \"OneMapSG.Grey\" #> #> $OneMapSG.LandLot #> [1] \"OneMapSG.LandLot\" #> #> $USGS #> [1] \"USGS\" #> #> $USGS.USTopo #> [1] \"USGS.USTopo\" #> #> $USGS.USImagery #> [1] \"USGS.USImagery\" #> #> $USGS.USImageryTopo #> [1] \"USGS.USImageryTopo\" #> #> $WaymarkedTrails #> [1] \"WaymarkedTrails\" #> #> $WaymarkedTrails.hiking #> [1] \"WaymarkedTrails.hiking\" #> #> $WaymarkedTrails.cycling #> [1] \"WaymarkedTrails.cycling\" #> #> $WaymarkedTrails.mtb #> [1] \"WaymarkedTrails.mtb\" #> #> $WaymarkedTrails.slopes #> [1] \"WaymarkedTrails.slopes\" #> #> $WaymarkedTrails.riding #> [1] \"WaymarkedTrails.riding\" #> #> $WaymarkedTrails.skating #> [1] \"WaymarkedTrails.skating\" #> #> $OpenAIP #> [1] \"OpenAIP\" #> #> $OpenSnowMap #> [1] \"OpenSnowMap\" #> #> $OpenSnowMap.pistes #> [1] \"OpenSnowMap.pistes\" #> #> $AzureMaps #> [1] \"AzureMaps\" #> #> $AzureMaps.MicrosoftImagery #> [1] \"AzureMaps.MicrosoftImagery\" #> #> $AzureMaps.MicrosoftBaseDarkGrey #> [1] \"AzureMaps.MicrosoftBaseDarkGrey\" #> #> $AzureMaps.MicrosoftBaseRoad #> [1] \"AzureMaps.MicrosoftBaseRoad\" #> #> $AzureMaps.MicrosoftBaseHybridRoad #> [1] \"AzureMaps.MicrosoftBaseHybridRoad\" #> #> $AzureMaps.MicrosoftTerraMain #> [1] \"AzureMaps.MicrosoftTerraMain\" #> #> $AzureMaps.MicrosoftWeatherInfraredMain #> [1] \"AzureMaps.MicrosoftWeatherInfraredMain\" #> #> $AzureMaps.MicrosoftWeatherRadarMain #> [1] \"AzureMaps.MicrosoftWeatherRadarMain\" #> #> $SwissFederalGeoportal #> [1] \"SwissFederalGeoportal\" #> #> $SwissFederalGeoportal.NationalMapColor #> [1] \"SwissFederalGeoportal.NationalMapColor\" #> #> $SwissFederalGeoportal.NationalMapGrey #> [1] \"SwissFederalGeoportal.NationalMapGrey\" #> #> $SwissFederalGeoportal.SWISSIMAGE #> [1] \"SwissFederalGeoportal.SWISSIMAGE\" #>"},{"path":"https://rstudio.github.io/leaflet/reference/reexports.html","id":null,"dir":"Reference","previous_headings":"","what":"Objects exported from other packages — reexports","title":"Objects exported from other packages — reexports","text":"objects imported packages. Follow links see documentation. htmlwidgets JS magrittr %>%","code":""},{"path":"https://rstudio.github.io/leaflet/reference/remove.html","id":null,"dir":"Reference","previous_headings":"","what":"Remove elements from a map — removeControl","title":"Remove elements from a map — removeControl","text":"Remove one features map, identified layerId; , clear features given type group.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/remove.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Remove elements from a map — removeControl","text":"","code":"removeControl(map, layerId) clearControls(map) clearGroup(map, group) removeImage(map, layerId) clearImages(map) removeTiles(map, layerId) clearTiles(map) removePopup(map, layerId) clearPopups(map) removeMarker(map, layerId) clearMarkers(map) removeMarkerCluster(map, layerId) clearMarkerClusters(map) removeMarkerFromCluster(map, layerId, clusterId) removeShape(map, layerId) clearShapes(map) removeGeoJSON(map, layerId) clearGeoJSON(map) removeMeasure(map) removeTopoJSON(map, layerId) clearTopoJSON(map)"},{"path":"https://rstudio.github.io/leaflet/reference/remove.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Remove elements from a map — removeControl","text":"map map widget object, possibly created leaflet() likely leafletProxy() layerId character vector; layer id(s) item remove group name group whose members removed clusterId id marker cluster layer","code":""},{"path":"https://rstudio.github.io/leaflet/reference/remove.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Remove elements from a map — removeControl","text":"new map object","code":""},{"path":"https://rstudio.github.io/leaflet/reference/remove.html","id":"note","dir":"Reference","previous_headings":"","what":"Note","title":"Remove elements from a map — removeControl","text":"used leaflet map object, functions actually remove features map object, simply add operation cause features removed added. words, add polygon \"foo\" call removeShape(\"foo\"), smart enough prevent polygon added first place; instead, map rendered, polygon added removed. reason, functions useful leaflet map objects really intended used leafletProxy() instead. WMS tile layers extensions tile layers, can also removed cleared via removeTiles() clearTiles().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/safeLabel.html","id":null,"dir":"Reference","previous_headings":"","what":"Sanitize textual labels — safeLabel","title":"Sanitize textual labels — safeLabel","text":"helper function used internally HTML-escape user-provided labels. prevents strings unintentionally treated HTML intended plaintext.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/safeLabel.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Sanitize textual labels — safeLabel","text":"","code":"safeLabel(label, data)"},{"path":"https://rstudio.github.io/leaflet/reference/safeLabel.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Sanitize textual labels — safeLabel","text":"label vector list plain characters HTML (marked htmltools::HTML()), formula resolves value. data data frame formula evaluated.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/showGroup.html","id":null,"dir":"Reference","previous_headings":"","what":"Show or hide layer groups — showGroup","title":"Show or hide layer groups — showGroup","text":"Hide groups layers without removing map entirely. Groups created using group parameter included layer adding functions.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/showGroup.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Show or hide layer groups — showGroup","text":"","code":"showGroup(map, group) hideGroup(map, group)"},{"path":"https://rstudio.github.io/leaflet/reference/showGroup.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Show or hide layer groups — showGroup","text":"map map modify group character vector one group names show hide","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/validateCoords.html","id":null,"dir":"Reference","previous_headings":"","what":"Utility function to check if a coordinates is valid — validateCoords","title":"Utility function to check if a coordinates is valid — validateCoords","text":"Utility function check coordinates valid","code":""},{"path":"https://rstudio.github.io/leaflet/reference/validateCoords.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Utility function to check if a coordinates is valid — validateCoords","text":"","code":"validateCoords(lng, lat, funcName, warn = TRUE, mode = c(\"point\", \"polygon\"))"},{"path":"https://rstudio.github.io/leaflet/reference/validateCoords.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Utility function to check if a coordinates is valid — validateCoords","text":"lng vector longitude values lat vector latitude values funcName Name calling function warn boolean. Whether generate warning message rows missing/invalid data mode \"point\" warn NA lng/lat values; \"polygon\" NA values expected used polygon delimiters","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-development-version","dir":"Changelog","previous_headings":"","what":"leaflet (development version)","title":"leaflet (development version)","text":"Color palette improvements. color palette functions now support viridisLite palettes (“magma”, “inferno”, “plasma”, “viridis”, “cividis”, “rocket”, “mako”, “turbo”) (@jack-davison, #924). Updated vignettes replace sp/raster usage sf/terra corresponding examples. (@jack-davison, #928) Updated vignettes replace sp/raster usage sf/`{terra} corresponding examples. (@jack-davison, #928)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-222","dir":"Changelog","previous_headings":"","what":"leaflet 2.2.2","title":"leaflet 2.2.2","text":"CRAN release: 2024-03-26 Fixed #893: Correctly call terra::crs() checking CRS SpatVector object pointData() polygonData() (thanks @mkoohafkan, #894). leaflet now brand new pkgdown site (@olivroy, #902) Replace viridis dependency viridisLite (@olivroy, #897) addRasterImage now takes options = gridOptions(), arbitrary Leaflet layer options can controlled. (#692)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-221","dir":"Changelog","previous_headings":"","what":"leaflet 2.2.1","title":"leaflet 2.2.1","text":"CRAN release: 2023-11-13 addProviderTiles() used leaflet.providers version 2.0.0 later, leaflet-providers HTML dependency produced can correctly cached knitr. used older versions leaflet.providers, HTML dependency uses temp files break knitr’s caching mechanism (thanks @qdread, @jaredlander; #884).","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-220","dir":"Changelog","previous_headings":"","what":"leaflet 2.2.0","title":"leaflet 2.2.0","text":"CRAN release: 2023-08-31","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"features-2-2-0","dir":"Changelog","previous_headings":"","what":"Features","title":"leaflet 2.2.0","text":"Added support SpatRaster SpatVector objects terra package. (#728) leaflet() now uses jQuery 3.6.0 provided via {jquerylib}package. result change, HTML dependencies leaflet() included dependencies item htmlwidget object returns. (#817, #821)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-2-0","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.2.0","text":"Use correct license OpenStreetMap attribution. (#811) Use xfun::base64_uri() base64 encoding instead markdown base64enc. (#823) Remove dependencies rgdal rgeos. (#837) Respect option scrollWheelZoom=FALSE. (#827) Fixed #866: Correctly call terra::.RGB() addRasterImage() SpatRaster object. (#869)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-212","dir":"Changelog","previous_headings":"","what":"leaflet 2.1.2","title":"leaflet 2.1.2","text":"CRAN release: 2023-03-10","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-1-2","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.1.2","text":"Removed S3 warnings found R devel (#848)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-211","dir":"Changelog","previous_headings":"","what":"leaflet 2.1.1","title":"leaflet 2.1.1","text":"CRAN release: 2022-03-23","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-1-1","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.1.1","text":"default marker icon addMarkers longer worked, due CDN relying apparently retired. Fixed pointing new CDN. (#782) New behavior tile.openstreetmap.org caused addTiles default tileset break viewed non-https protocol recent versions Chrome. Fixed always using https protocol connect openstreetmap. (#786)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-210","dir":"Changelog","previous_headings":"","what":"leaflet 2.1.0","title":"leaflet 2.1.0","text":"CRAN release: 2022-02-16","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-1-0","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.1.0","text":"Enable JS function literals (wrapped htmlwidgets::JS()) included arguments methods invoked leafletProxy objects. (JS function literals already included methods invoked leaflet objects, change just brings leafletProxy parity.) (#420) Add missing CSS rule show right-pane left-pane (rstudio/rmarkdown#1949, #770) Allow hidden suspended leaflet maps queue calls (add raster images) rendered. new leaflet map created, pending calls removed. (#771)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-2041","dir":"Changelog","previous_headings":"","what":"leaflet 2.0.4.1","title":"leaflet 2.0.4.1","text":"CRAN release: 2021-01-07","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"features-2-0-4-1","dir":"Changelog","previous_headings":"","what":"Features","title":"leaflet 2.0.4.1","text":"Updated proj4.js 2.6.2","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-0-4-1","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.0.4.1","text":"Minor tweaks example data tests, required stay CRAN Fixes broken URL (#742) updated examples run system files (#576) including updated .Rmd .html docs.","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-203","dir":"Changelog","previous_headings":"","what":"leaflet 2.0.3","title":"leaflet 2.0.3","text":"CRAN release: 2019-11-16","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"breaking-changes-2-0-3","dir":"Changelog","previous_headings":"","what":"Breaking changes","title":"leaflet 2.0.3","text":"data(\"providers\") data(\"providers.details\") longer exist. Please use leaflet::providers leaflet::providers.details. (#636)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-0-3","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.0.3","text":"Integrated data leaflet.providers package. See leaflet.providers details. (#636) Fixed rstudio/crosstalk#58, caused Leaflet maps used Crosstalk shared data Shiny apps, redrawn incorrect times. invokeRemote() now resolves html dependencies passing shiny::createWebDependency() (#620). Upgrade leaflet-provider 1.4.0, enable map variants CartoDB.Voyager (#567) sf objects names attributes st_geometry now visualise correctly (#595) GeoJSON objects missing properties can now displayed (#622)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-202","dir":"Changelog","previous_headings":"","what":"leaflet 2.0.2","title":"leaflet 2.0.2","text":"CRAN release: 2018-08-27","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-0-2","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.0.2","text":"Require viridis >= 0.5.1 avoid namespace issues viridisLite (#557) Fixed broken mouse events using leaflet-search leaflet.extras within shiny applications (#563) Use leaflet namespace providers addMiniMap make function accessible packages. Fixes r-tmap/tmap#231. (#568) Require scales >= 1.0.0 avoid exact color matching issues (#578)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-201","dir":"Changelog","previous_headings":"","what":"leaflet 2.0.1","title":"leaflet 2.0.1","text":"CRAN release: 2018-06-04","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"features-2-0-1","dir":"Changelog","previous_headings":"","what":"Features","title":"leaflet 2.0.1","text":"Added method addMapPane add custom pane layers fine tune control layer ordering. New feature within leaflet.js v1.x. (#549) Exposed htmlwidgets sizingPolicy leaflet() (#548)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-0-1","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.0.1","text":"Default marker icon locations now use unpkg.com instead leaflet cdn using https file protocols. (#544) .leaflet-map-pane z-index switched ‘auto’. Allows map panes appear map appear later dom. (#537) Use correct Leaflet.js scale control remove method. (#547) Start world view using flyTo flyToBounds. (#552)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-200","dir":"Changelog","previous_headings":"","what":"leaflet 2.0.0","title":"leaflet 2.0.0","text":"CRAN release: 2018-04-20","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"breaking-changes-2-0-0","dir":"Changelog","previous_headings":"","what":"Breaking changes","title":"leaflet 2.0.0","text":"Update latest leaflet.js v1.3.1 (#453, 314616f) Please see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html latest documentation plugins updated versions compatible leaflet > 1.0 (#458) jQuery, https://github.com/jquery/jquery Leaflet (JavaScript library), https://github.com/Leaflet/Leaflet Leaflet Providers, https://github.com/leaflet-extras/leaflet-providers leaflet-measure, https://github.com/ljagis/leaflet-measure Leaflet.Terminator, https://github.com/joergdietrich/Leaflet.Terminator Leaflet.SimpleGraticule, https://github.com/ablakey/Leaflet.SimpleGraticule Leaflet.MagnifyingGlass, https://github.com/bbecquet/Leaflet.MagnifyingGlass Leaflet.MiniMap, https://github.com/Norkart/Leaflet-MiniMap Leaflet.awesome-markers, https://github.com/lvoogdt/Leaflet.awesome-markers Leaflet.EasyButton, https://github.com/CliffCloud/Leaflet.EasyButton/ Proj4Leaflet, https://github.com/kartena/Proj4Leaflet leaflet-locationfilter, https://github.com/kajic/leaflet-locationfilter leaflet-omnivore, https://github.com/mapbox/leaflet-omnivore topojson, https://github.com/topojson/topojson Leaflet.label (https://github.com/Leaflet/Leaflet.labelExtension) L.Label adopted within Leaflet.js L.Tooltip Tooltips now displayed default Leaflet.js styling custom javascript extensions, change *.bindLabel() *.bindTooltip()","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-features-2-0-0","dir":"Changelog","previous_headings":"","what":"Bug fixes and features","title":"leaflet 2.0.0","text":"Relative protocols used possible adding tiles (#526). RStudio 1.1.x Linux Windows, known issue ‘https://’ routes fail load, works within browsers (rstudio/rstudio#2661). Added providers addProviderTiles(): “OpenStreetMap.CH”, “OpenInfraMap”, “OpenInfraMap.Power”, “OpenInfraMap.Telecom”, “OpenInfraMap.Petroleum”, “OpenInfraMap.Water”, “OpenPtMap”, “OpenRailwayMap”, “OpenFireMap”, “SafeCast”. (4aea447) L.multiPolyline absorbed L.polyline, accepts multiple array polyline information. https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#polyline. (#515) Fix bug icons anchored top-center, center-center (2a60751) Fix bug markers appear self contained knitr files (cc79bc3) leaflet-label plugin now L.tooltip leaflet.js. labelOptions() now translates old options clickable interactive noHide permanent. Fix bug default addTiles() work .html files served directly filesystem. Add groupOptions function. Currently option letting specify zoom levels group visible. Fix bug accessing columns formulas data source Crosstalk SharedData object wrapping spatial data frame sf object. Fix strange wrapping behavior legend, especially common Chrome browser zoom level 100%. Fix incorrect opacity NA entry legend. (PR #425) Added support drag events (#405) Ensure type safety .indexOf(stamp) (#396) validateCoords() warns invalid polygon data (#393) Added method argument addRasterImage() enable nearest neighbor interpolation projecting categorical rasters (#462) Added 'auto' method addRasterImage(). Projected factor results coerced factors. (9accc7e) Added data parameter remaining addXXX() methods, including addLegend. (f273edd, #491, #485) Added preferCanvas argument leafletOptions() (#521)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-110","dir":"Changelog","previous_headings":"","what":"leaflet 1.1.0","title":"leaflet 1.1.0","text":"CRAN release: 2017-02-21 Add support sf. sf, sfc, sfg classes supported POINT, LINESTRING, MULTILINESTRING, POLYGON, MULTIPOLYGON geometries (note MULTIPOINT currently supported). Added support Crosstalk (https://rstudio.github.io/crosstalk/). Added option highlight polygons, polylines, circles, rectangles hover (use highlightOptions parameter). Fix behavior data contains NA points, zero rows. Previously cause error. Added popupOptions parameter markers shape layers. Upgraded existing plugins respective latest versions added missing/new functionality plugins. (PR #293) Added Proj4Leaflet plugin (PR #294). Added EasyButton plugin (PR #295). Added Graticule plugin (PR #293). Color palette improvements. color palette functions now support viridis palettes (“viridis”, “magma”, “inferno”, “plasma”). Color palette functions now support reversing order colors used, via reverse=TRUE. colorFactor() longer interpolates qualitative RColorBrewer palettes, unless number factor levels mapped exceeds number colors specified RColorBrewer palette. (Issue #300) Upgrade leaflet.js 0.7.7.1 (PR #359) Added way Map instance instantiated via factory.","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-102","dir":"Changelog","previous_headings":"","what":"leaflet 1.0.2","title":"leaflet 1.0.2","text":"used leafletProxy, fitBounds return input object output, magrittr chains break fitBounds called. Add addMeasure()/removeMeasure() functions allow users measure lines areas, via leaflet-measure plugin @ljagis. (PR #171. Thanks, Kenton Russell!) Add input${mapid}_center Shiny event. Add support labels layers, show either statically hover. (PR #181. Thanks Bhaskar Karambelkar!) Add support markers configurable colors icons, via Leaflet.awesome-markers plugin @lvoogdt. See ?addAwesomeMarkers. (PR #184. Great work, Bhaskar!) Add support Leaflet.Terminator plugin @joergdietrich. Overlays day night regions map. See ?addTerminator. (PR #184, thanks Bhaskar!) Add support Leaflet.SimpleGraticule plugin @ablakey. See ?addSimpleGraticule. (PR #184, thanks Bhaskar!) Add support Leaflet.MagnifyingGlass plugin @bbecquet. Adds configurable magnifying glass displays area cursor increased zoom level. See ?addMagnifyingGlass. (PR #184, still Bhaskar!) Add support Leaflet-MiniMap plugin @Norkart. Adds mini map corner can used see change bounds main map. See ?addMiniMap. (PR #184, Bhaskar !) addScaleBar related functions added, showing Leaflet’s built-scale bar one corners map. (PR #201. Thanks Kent Johnson!)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-101","dir":"Changelog","previous_headings":"","what":"leaflet 1.0.1","title":"leaflet 1.0.1","text":"CRAN release: 2016-02-27 Fix #242: Compatibility htmlwidgets 0.6 (thanks byzheng).","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-100","dir":"Changelog","previous_headings":"","what":"leaflet 1.0.0","title":"leaflet 1.0.0","text":"CRAN release: 2015-06-24 Initial release","code":""}] +[{"path":"https://rstudio.github.io/leaflet/CONTRIBUTING.html","id":null,"dir":"","previous_headings":"","what":"Contributing to {leaflet}","title":"Contributing to {leaflet}","text":"welcome contributions leaflet package! submit contribution: Fork repository make changes. Ensure signed individual corporate contributor agreement appropriate. can send signed copy contribute@rstudio.com. Submit pull request. generally merge pull requests update included web libraries (Bootstrap jQuery) difficult us verify update done correctly; prefer update libraries .","code":""},{"path":"https://rstudio.github.io/leaflet/CONTRIBUTING.html","id":"how-to-make-changes","dir":"","previous_headings":"","what":"How to make changes","title":"Contributing to {leaflet}","text":"submit pull request, please following: Add entry NEWS concisely describing changed. appropriate, add unit tests tests/ directory. Run Build->Check Package RStudio IDE, devtools::check(), make sure change add messages, warnings, errors. things make easier leaflet development team evaluate pull request. Even , may still decide modify code even merge . Factors may prevent us merging pull request include: breaking backward compatibility adding feature consider relevant leaflet hard understand hard maintain future computationally expensive intuitive people use try responsive provide feedback case decide merge pull request.","code":""},{"path":"https://rstudio.github.io/leaflet/CONTRIBUTING.html","id":"filing-issues","dir":"","previous_headings":"","what":"Filing issues","title":"Contributing to {leaflet}","text":"find bug leaflet, can also file issue. Please provide much relevant information can, include minimal reproducible example possible.","code":""},{"path":"https://rstudio.github.io/leaflet/PULL_REQUEST_TEMPLATE.html","id":"pull-request","dir":"","previous_headings":"","what":"Pull Request","title":"NA","text":"submit pull request, please following: Add entry NEWS concisely describing changed. appropriate, add unit tests tests/testthat directory. Run Build->Check Package RStudio IDE, devtools::check(), make sure change add messages, warnings, errors. things make easier leaflet development team evaluate pull request. Even , may still decide modify code even merge . Factors may prevent us merging pull request include: breaking backward compatibility adding feature consider relevant leaflet hard understand hard maintain future computationally expensive intuitive people use try responsive provide feedback case decide merge pull request.","code":""},{"path":"https://rstudio.github.io/leaflet/PULL_REQUEST_TEMPLATE.html","id":"minimal-reproducible-example","dir":"","previous_headings":"","what":"Minimal reproducible example","title":"NA","text":"Finally, please include minimal reprex. goal reprex make easy possible recreate problem can fix . ’ve never heard reprex , start reading https://reprex.tidyverse.org/, follow advice page. include session info unless ’s explicitly asked , ’ve used reprex::reprex(..., session_info = TRUE) hide away. Make sure webshot installed reprex produces images leaflet htmlwidgets. Delete instructions read . Brief description solution PR task list: - [ ] Update NEWS - [ ] Add tests (appropriate) - R code tests: tests/testthat/ - Visual tests: R/zzz_viztest.R - [ ] Update documentation devtools::document()","code":"# make sure webshot is installed to take pictures of htmlwidgets if (!(\"webshot\" %in% installed.packages()[, \"Package\"])) { install.packages(\"webshot\") # restart R process to fully integrate with knitr } reprex::reprex({ library(leaflet) # insert reprex here leaflet() %>% addTiles() }) # insert reprex here"},{"path":"https://rstudio.github.io/leaflet/articles/basemaps.html","id":"default-openstreetmap-tiles","dir":"Articles","previous_headings":"","what":"Default (OpenStreetMap) Tiles","title":"Using Basemaps","text":"easiest way add tiles calling addTiles() arguments; default, OpenStreetMap tiles used.","code":"library(leaflet) m <- leaflet() %>% setView(lng = -71.0589, lat = 42.3601, zoom = 12) m %>% addTiles()"},{"path":"https://rstudio.github.io/leaflet/articles/basemaps.html","id":"third-party-tiles","dir":"Articles","previous_headings":"","what":"Third-Party Tiles","title":"Using Basemaps","text":"Alternatively, many popular free third-party basemaps can added using addProviderTiles() function, implemented using leaflet-providers plugin. See complete set. convenience, leaflet also provides named list third-party tile providers supported plugin. enables use auto-completion feature favorite R IDE (like RStudio) remember look supported tile providers; just type providers$ choose one options. can also use names(providers) view options. Note tile set providers require register; see project page information. can pass access tokens/keys, options, tile provider populating options argument providerTileOptions() function. October 2023, Stamen map tiles now hosted Stadia Maps. Replace references providers$Stamen.____ providers$Stadia.Stamen____ use new tiles. Published maps now require account; created, login register domain(s) maps published.","code":"m %>% addProviderTiles(providers$CartoDB.Positron) m %>% addProviderTiles(providers$Esri.NatGeoWorldMap) m %>% addProviderTiles(providers$OpenTopoMap) m %>% addProviderTiles(providers$Stadia.StamenToner)"},{"path":"https://rstudio.github.io/leaflet/articles/basemaps.html","id":"custom-tile-url-template","dir":"Articles","previous_headings":"","what":"Custom Tile URL Template","title":"Using Basemaps","text":"happen custom map tile URL template use, can provide argument addTiles().","code":""},{"path":"https://rstudio.github.io/leaflet/articles/basemaps.html","id":"wms-tiles","dir":"Articles","previous_headings":"","what":"WMS Tiles","title":"Using Basemaps","text":"can use addWMSTiles() add WMS (Web Map Service) tiles. map shows Base Reflectivity (measure intensity precipitation occurring) using WMS Iowa Environmental Mesonet:","code":"leaflet() %>% addTiles() %>% setView(-93.65, 42.0285, zoom = 4) %>% addWMSTiles( \"http://mesonet.agron.iastate.edu/cgi-bin/wms/nexrad/n0r.cgi\", layers = \"nexrad-n0r-900913\", options = WMSTileOptions(format = \"image/png\", transparent = TRUE), attribution = \"Weather data © 2012 IEM Nexrad\" )"},{"path":"https://rstudio.github.io/leaflet/articles/basemaps.html","id":"combining-tile-layers","dir":"Articles","previous_headings":"","what":"Combining Tile Layers","title":"Using Basemaps","text":"aren’t restricted using single basemap map; can stack adding multiple tile layers. generally makes sense front tiles consist semi transparent tiles, adjusted opacity via options argument.","code":"m %>% addProviderTiles( providers$Esri.WorldImagery, options = providerTileOptions(opacity = 0.5) ) %>% addProviderTiles(providers$CartoDB.VoyagerOnlyLabels)"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"data-source","dir":"Articles","previous_headings":"","what":"Data source","title":"Choropleths","text":"’ll start loading data JSON. Leaflet.js example loads JSON directly JavaScript, Leaflet R package instead want load data R. case, ’ll use sf package load data sf data.frame, let us easily manipulate geographic features, properties, R. can see, now sf data.frame name (state name) density (population density people/mi2) columns GeoJSON.","code":"states <- sf::read_sf(\"https://rstudio.github.io/leaflet/json/us-states.geojson\") class(states) #> [1] \"sf\" \"tbl_df\" \"tbl\" \"data.frame\" names(states) #> [1] \"id\" \"name\" \"density\" \"geometry\""},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"basic-states-map","dir":"Articles","previous_headings":"","what":"Basic states map","title":"Choropleths","text":"Next, let’s make basic map just outline states. basemap, ’ll use \"mapbox.light\" MapBox style example ; don’t MapBox account, can just use addTiles() place addProviderTiles() call, choose free provider. ’ve saved basic basemap separate variable m can easily iterate addPolygons() call work rest tutorial. add uniform polygons default styling, just call addPolygons() additional arguments.","code":"m <- leaflet(states) %>% setView(-96, 37.8, 4) %>% addProviderTiles(\"MapBox\", options = providerTileOptions( id = \"mapbox.light\", accessToken = Sys.getenv('MAPBOX_ACCESS_TOKEN'))) m %>% addPolygons() #> Warning in sf::st_is_longlat(x): bounding box has potentially an invalid #> value range for longlat data"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"adding-some-color","dir":"Articles","previous_headings":"","what":"Adding some color","title":"Choropleths","text":"Now, let’s color states according population density. various options mapping data colors; example ’ll match Leaflet.js tutorial mapping specific set bins RColorBrewer colors. First, ’ll define bins. numeric vector defines boundaries intervals ((0,10], (10,20], ). , ’ll call colorBin() generate palette function maps RColorBrewer \"YlOrRd\" colors bins. Finally, ’ll modify addPolygons() use palette function density values generate vector colors fillColor, also add static style properties.","code":"bins <- c(0, 10, 20, 50, 100, 200, 500, 1000, Inf) pal <- colorBin(\"YlOrRd\", domain = states$density, bins = bins) m %>% addPolygons( fillColor = ~pal(density), weight = 2, opacity = 1, color = \"white\", dashArray = \"3\", fillOpacity = 0.7) #> Warning in sf::st_is_longlat(x): bounding box has potentially an invalid #> value range for longlat data"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"adding-interaction","dir":"Articles","previous_headings":"","what":"Adding interaction","title":"Choropleths","text":"next thing ’ll want make polygons highlight mouse passes . addPolygon() function highlight argument makes simple. (Leaflet.js tutorial also adds event handler zooms state ’s clicked. isn’t currently possible Leaflet R package, except either custom JavaScript using Shiny, outside scope example.)","code":"m %>% addPolygons( fillColor = ~pal(density), weight = 2, opacity = 1, color = \"white\", dashArray = \"3\", fillOpacity = 0.7, highlightOptions = highlightOptions( weight = 5, color = \"#666\", dashArray = \"\", fillOpacity = 0.7, bringToFront = TRUE)) #> Warning in sf::st_is_longlat(x): bounding box has potentially an invalid #> value range for longlat data"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"custom-info","dir":"Articles","previous_headings":"","what":"Custom info","title":"Choropleths","text":"Now let’s expose state names values user. Leaflet.js tutorial shows hovered-state’s information custom control. , ’s possible adding custom JavaScript using Shiny, example ’ll use built-labels feature instead. ’ll generate labels handcrafting HTML, passing lapply(htmltools::HTML) Leaflet knows treat label HTML instead plain text. ’ll also set label options improve style label element . final version polygon layer, let’s save result back m variable.","code":"labels <- sprintf( \"%s<\/strong>
    %g people / mi2<\/sup>\", states$name, states$density ) %>% lapply(htmltools::HTML) m <- m %>% addPolygons( fillColor = ~pal(density), weight = 2, opacity = 1, color = \"white\", dashArray = \"3\", fillOpacity = 0.7, highlightOptions = highlightOptions( weight = 5, color = \"#666\", dashArray = \"\", fillOpacity = 0.7, bringToFront = TRUE), label = labels, labelOptions = labelOptions( style = list(\"font-weight\" = \"normal\", padding = \"3px 8px\"), textsize = \"15px\", direction = \"auto\")) #> Warning in sf::st_is_longlat(x): bounding box has potentially an invalid #> value range for longlat data m"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"legend","dir":"Articles","previous_headings":"","what":"Legend","title":"Choropleths","text":"final step, let’s add legend. chose color map using colorBin(), addLegend() function makes particularly easy add legend correct colors intervals.","code":"m %>% addLegend(pal = pal, values = ~density, opacity = 0.7, title = NULL, position = \"bottomright\")"},{"path":"https://rstudio.github.io/leaflet/articles/choropleths.html","id":"complete-code","dir":"Articles","previous_headings":"","what":"Complete code","title":"Choropleths","text":"","code":"# From https://leafletjs.com/examples/choropleth/us-states.js states <- sf::read_sf(\"https://rstudio.github.io/leaflet/json/us-states.geojson\") bins <- c(0, 10, 20, 50, 100, 200, 500, 1000, Inf) pal <- colorBin(\"YlOrRd\", domain = states$density, bins = bins) labels <- sprintf( \"%s<\/strong>
    %g people / mi2<\/sup>\", states$name, states$density ) %>% lapply(htmltools::HTML) leaflet(states) %>% setView(-96, 37.8, 4) %>% addProviderTiles(\"MapBox\", options = providerTileOptions( id = \"mapbox.light\", accessToken = Sys.getenv('MAPBOX_ACCESS_TOKEN'))) %>% addPolygons( fillColor = ~pal(density), weight = 2, opacity = 1, color = \"white\", dashArray = \"3\", fillOpacity = 0.7, highlightOptions = highlightOptions( weight = 5, color = \"#666\", dashArray = \"\", fillOpacity = 0.7, bringToFront = TRUE), label = labels, labelOptions = labelOptions( style = list(\"font-weight\" = \"normal\", padding = \"3px 8px\"), textsize = \"15px\", direction = \"auto\")) %>% addLegend(pal = pal, values = ~density, opacity = 0.7, title = NULL, position = \"bottomright\") #> Warning in sf::st_is_longlat(x): bounding box has potentially an invalid #> value range for longlat data"},{"path":"https://rstudio.github.io/leaflet/articles/colors.html","id":"common-parameters","dir":"Articles","previous_headings":"","what":"Common parameters","title":"Colors","text":"four color functions two required arguments, palette domain. palette argument specifies colors map data . argument can take one several forms: name preset palette RColorBrewer package, e.g., \"RdYlBu\", \"Accent\", \"Greens\". full name viridis palette: \"magma\", \"inferno\", \"plasma\", \"viridis\", \"cividis\", \"rocket\", \"mako\", \"turbo\". character vector RGB named colors, e.g., palette(), c(\"#000000\", \"#0000FF\", \"#FFFFFF\"), topo.colors(10). function receives single value 0 1 returns color, e.g.,: colorRamp(c(\"#000000\", \"#FFFFFF\"), interpolate=\"spline\") domain argument tells color function range input values. can pass NULL create palette function doesn’t preset range; range inferred data time invoke palette function. use palette function multiple times across different data, ’s important provide non-NULL value domain scaling data colors consistent.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/colors.html","id":"coloring-continuous-data","dir":"Articles","previous_headings":"Common parameters","what":"Coloring continuous data","title":"Colors","text":"’ve loaded shape data countries, including numeric field gdp_md_est contains GDP estimates.","code":"# From http://data.okfn.org/data/datasets/geo-boundaries-world-110m countries <- sf::read_sf(\"https://rstudio.github.io/leaflet/json/countries.geojson\") map <- leaflet(countries) par(mar = c(5,5,0,0), cex = 0.8) hist(countries$gdp_md_est, breaks = 20, main = \"\")"},{"path":"https://rstudio.github.io/leaflet/articles/colors.html","id":"continuous-input-continuous-colors-colornumeric","dir":"Articles","previous_headings":"Common parameters > Coloring continuous data","what":"Continuous input, continuous colors (colorNumeric)","title":"Colors","text":"Let’s start mapping GDP values directly \"Blues\" palette Color Brewer 2. ’ll use colorNumeric() create mapping function. \"Blues\" palette contains nine colors, colorNumeric() interpolates colors get continuous output. palette parameter ordered list colors map colors . case used Color Brewer palette, ’ve used c(\"white\", \"navy\") c(\"#FFFFFF\", \"#000080\") similar effect. can also pass two colors, diverging palette example. maximum flexibility, can even pass function takes numeric value interval [0,1] returns color. second parameter, domain, indicates set input values mapping colors. colorNumeric(), can provide either min/max example, set numbers colorNumeric() can call range() . result pal, function can accept numeric vectors values range range(countries$gdp_md_est) return colors \"#RRGGBB\" format.","code":"# Create a continuous palette function pal <- colorNumeric( palette = \"Blues\", domain = countries$gdp_md_est) # Apply the function to provide RGB colors to addPolygons map %>% addPolygons(stroke = FALSE, smoothFactor = 0.2, fillOpacity = 1, color = ~pal(gdp_md_est))"},{"path":"https://rstudio.github.io/leaflet/articles/colors.html","id":"continuous-input-discrete-colors-colorbin-and-colorquantile","dir":"Articles","previous_headings":"Common parameters > Coloring continuous data","what":"Continuous input, discrete colors (colorBin() and colorQuantile())","title":"Colors","text":"colorBin() maps numeric input data fixed number output colors using binning (slicing input domain value). can specify either exact breaks use, desired number bins. Note latter case, pretty = TRUE (default) ’ll end nice round breaks necessarily number bins wanted. colorQuantile() maps numeric input data fixed number output colors using quantiles (slicing input domain subsets equal numbers observations).","code":"binpal <- colorBin(\"Blues\", countries$gdp_md_est, 6, pretty = FALSE) map %>% addPolygons(stroke = FALSE, smoothFactor = 0.2, fillOpacity = 1, color = ~binpal(gdp_md_est)) qpal <- colorQuantile(\"Blues\", countries$gdp_md_est, n = 7) map %>% addPolygons(stroke = FALSE, smoothFactor = 0.2, fillOpacity = 1, color = ~qpal(gdp_md_est))"},{"path":"https://rstudio.github.io/leaflet/articles/colors.html","id":"coloring-categorical-data","dir":"Articles","previous_headings":"Common parameters","what":"Coloring categorical data","title":"Colors","text":"categorical data, use colorFactor(). palette contains number elements factor levels, mapping 1:1; otherwise, palette interpolated produce desired number colors. can specify input domain either passing factor character vector domain, providing levels directly using levels parameter (case domain ignored).","code":"# Make up some random levels. (TODO: Better example) countries$category <- factor(sample.int(5L, nrow(countries), TRUE)) factpal <- colorFactor(topo.colors(5), countries$category) leaflet(countries) %>% addPolygons(stroke = FALSE, smoothFactor = 0.2, fillOpacity = 1, color = ~factpal(category))"},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"functions-for-extending-leaflet","dir":"Articles","previous_headings":"","what":"Functions for extending leaflet","title":"Extending Leaflet","text":"Certain functions made available use code extending Leaflet.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"derivepointsderivepolygons","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"derivePoints/derivePolygons","title":"Extending Leaflet","text":"derivePoints() derivePolygons() can used extract point shape (polygon/line/circle/rectangle) data data.frame spatial object sf package. tries auto determine latitude/longitude colnames specified use user supplied column mappings.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"evalformula","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"evalFormula","title":"Extending Leaflet","text":"evalFormula() used evaluate formula given data return results. e.g., leaflet(.data.frame) %>% addMarkers(label=~name) internally uses evalFormula() calculate correct label values data using ~name formula.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"expandlimits","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"expandLimits","title":"Extending Leaflet","text":"can call expandLimits() make sure map’s view just enough show every point/shape data. way don’t determine exact bounds map.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"filternull","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"filterNULL","title":"Extending Leaflet","text":"Often passing list R JavaScript desirable remove null elements, ’s exactly filterNULL() .","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"getmapdata","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"getMapData","title":"Extending Leaflet","text":"getMapData() accesses data object passed calling leaflet() function.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"invokemethod","dir":"Articles","previous_headings":"Functions for extending leaflet","what":"invokeMethod","title":"Extending Leaflet","text":"invokeMethod() glue R code JavaScript code. Requires corresponding method JavaScript side.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/extending.html","id":"example","dir":"Articles","previous_headings":"","what":"Example","title":"Extending Leaflet","text":"small example shows can integrate Bing.com basemap layer plugin","code":"library(leaflet) library(htmltools) library(htmlwidgets) bingPlugin <- htmlDependency( \"leaflet.plugins\", \"2.0.0\", src = normalizePath(\"./js\"), script = \"Bing.min.js\" ) registerPlugin <- function(map, plugin) { map$dependencies <- c(map$dependencies, list(plugin)) map } leaflet() %>% setView(-122.23, 37.75, zoom = 10) %>% registerPlugin(bingPlugin) %>% onRender(\"function(el, x) { var imagerySet = 'Aerial'; var bing = new L.BingLayer('LfO3DMI9S6GnXD7d0WGs~bq2DRVkmIAzSOFdodzZLvw~Arx8dclDxmZA0Y38tHIJlJfnMbGq5GXeYmrGOUIbS2VLFzRKCK0Yv_bAl6oe-DOc', {type: imagerySet}); this.addLayer(bing); }\")"},{"path":"https://rstudio.github.io/leaflet/articles/json.html","id":"reading-as-sf","dir":"Articles","previous_headings":"","what":"Reading as {sf}","title":"Working with GeoJSON & TopoJSON","text":"first approach use sf packages read GeoJSON/TopoJSON sf data.frames. , can use full functionality polygons, markers, colors, legends, etc. approach preferred using addGeoJSON()/addTopoJSON(), makes easy use feature properties determining map colors, labels, etc., modify add new properties. main downside approach supports feature collections features type, whereas GeoJSON/TopoJSON ’s possible—though uncommon—single feature collection contains, say, markers polygons.","code":"# From https://eric.clst.org/tech/usgeojson/ and # https://en.wikipedia.org/wiki/List_of_United_States_counties_and_county_equivalents nycounties <- sf::read_sf(\"https://rstudio.github.io/leaflet/json/nycounties.geojson\") pal <- colorNumeric(\"viridis\", NULL) leaflet(nycounties) %>% addTiles() %>% addPolygons(stroke = FALSE, smoothFactor = 0.3, fillOpacity = 1, fillColor = ~pal(log10(pop)), label = ~paste0(county, \": \", formatC(pop, big.mark = \",\"))) %>% addLegend(pal = pal, values = ~log10(pop), opacity = 1.0, labFormat = labelFormat(transform = function(x) round(10^x)))"},{"path":"https://rstudio.github.io/leaflet/articles/json.html","id":"working-with-raw-geojsontopojson","dir":"Articles","previous_headings":"","what":"Working with raw GeoJSON/TopoJSON","title":"Working with GeoJSON & TopoJSON","text":"addGeoJSON() addTopoJSON() accept GeoJSON data either parsed (nested lists) stringified (single-element character vector) format. Note larger JSON data, using parsed significantly slower using stringified, parsed data must go JSON encoding step. simple example using stringified data:","code":"topoData <- readLines(\"https://rstudio.github.io/leaflet/json/us-10m.json\") %>% paste(collapse = \"\\n\") leaflet() %>% setView(lng = -98.583, lat = 39.833, zoom = 3) %>% addTiles() %>% addTopoJSON(topoData, weight = 1, color = \"#444444\", fill = FALSE)"},{"path":"https://rstudio.github.io/leaflet/articles/json.html","id":"styling-raw-geojsontopojson","dir":"Articles","previous_headings":"","what":"Styling raw GeoJSON/TopoJSON","title":"Working with GeoJSON & TopoJSON","text":"can modify style GeoJSON/TopoJSON features ways. (Currently paths shapes can styled; marker styling supported.) One way apply styles features use arguments directly addGeoJSON()/addTopoJSON(). Another way encode styling information directly JSON object/string putting style object directly underneath top level JSON object. can provide feature-specific styles annotating feature’s property object style: {...} object. feature-specific styles highest precedence, top-level style object, finally style-related arguments passed function. See Leaflet’s path options available style properties. previous example demonstrated style arguments. involved example sets global styles per-feature styles directly JSON object. (approach recommended applying styling R; instead, use approach described convert sf first. However, control process generates GeoJSON first place, might use techniques put styling information directly JSON.)","code":"library(jsonlite) # From http://data.okfn.org/data/datasets/geo-boundaries-world-110m geojson <- readLines(\"https://rstudio.github.io/leaflet/json/countries.geojson\", warn = FALSE) %>% paste(collapse = \"\\n\") %>% fromJSON(simplifyVector = FALSE) # Default styles for all features geojson$style = list( weight = 1, color = \"#555555\", opacity = 1, fillOpacity = 0.8 ) # Gather GDP estimate from all countries gdp_md_est <- sapply(geojson$features, function(feat) { feat$properties$gdp_md_est }) # Gather population estimate from all countries pop_est <- sapply(geojson$features, function(feat) { max(1, feat$properties$pop_est) }) # Color by per-capita GDP using quantiles pal <- colorQuantile(\"Greens\", gdp_md_est / pop_est) # Add a properties$style list to each feature geojson$features <- lapply(geojson$features, function(feat) { feat$properties$style <- list( fillColor = pal( feat$properties$gdp_md_est / max(1, feat$properties$pop_est) ) ) feat }) # Add the now-styled GeoJSON object to the map leaflet() %>% addGeoJSON(geojson)"},{"path":"https://rstudio.github.io/leaflet/articles/leaflet.html","id":"introduction","dir":"Articles","previous_headings":"","what":"Introduction","title":"Introduction to leaflet","text":"Leaflet one popular open-source JavaScript libraries interactive maps. ’s used websites ranging New York Times Washington Post GitHub Flickr, well GIS specialists like OpenStreetMap, Mapbox, CartoDB. R package makes easy integrate control Leaflet maps R.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/leaflet.html","id":"features","dir":"Articles","previous_headings":"Introduction","what":"Features","title":"Introduction to leaflet","text":"Interactive panning/zooming Map tiles Markers Polygons Lines Popups GeoJSON Create maps right R console RStudio Embed maps knitr/R Markdown/Quarto documents, Shiny apps Easily render spatial objects sf package, data frames latitude/longitude columns Use map bounds mouse events drive Shiny logic Display maps non spherical Mercator projections Augment map features using chosen plugins leaflet plugins repository","code":""},{"path":"https://rstudio.github.io/leaflet/articles/leaflet.html","id":"installation","dir":"Articles","previous_headings":"Introduction","what":"Installation","title":"Introduction to leaflet","text":"install R package, run command R prompt: installed, can use package R console, within R Markdown documents, within Shiny applications.","code":"install.packages(\"leaflet\") # to install the development version from Github, run # devtools::install_github(\"rstudio/leaflet\")"},{"path":"https://rstudio.github.io/leaflet/articles/leaflet.html","id":"basic-usage","dir":"Articles","previous_headings":"Introduction","what":"Basic Usage","title":"Introduction to leaflet","text":"create Leaflet map basic steps: Create map widget calling leaflet(). Add layers (.e., features) map using layer functions (e.g., addTiles, addMarkers, addPolygons) modify map widget. Repeat step 2 desired. Print map widget display . ’s basic example: case ’re familiar pipe (magrittr base) operator (%>% / |>), equivalent without using pipes:","code":"library(leaflet) m <- leaflet() %>% addTiles() %>% # Add default OpenStreetMap map tiles addMarkers(lng=174.768, lat=-36.852, popup=\"The birthplace of R\") m # Print the map m <- leaflet() m <- addTiles(m) m <- addMarkers(m, lng=174.768, lat=-36.852, popup=\"The birthplace of R\") m"},{"path":"https://rstudio.github.io/leaflet/articles/leaflet.html","id":"next-steps","dir":"Articles","previous_headings":"Introduction","what":"Next Steps","title":"Introduction to leaflet","text":"highly recommend proceed Map Widget page exploring rest site, describes common idioms ’ll use throughout examples pages. Although tried provide R-like interface Leaflet, may want check API documentation Leaflet occasionally meanings certain parameters clear .","code":""},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"data-sources","dir":"Articles","previous_headings":"","what":"Data sources","title":"Add markers to leaflet","text":"Point data markers can come variety sources: POINT, sfc_POINT, sf objects (sf package); X Y dimensions considered Two-column numeric matrices (first column longitude, second latitude) Data frame latitude longitude columns. can explicitly tell marker function columns contain coordinate data (e.g., addMarkers(lng = ~Longitude, lat = ~Latitude)), let function look columns named lat/latitude lon/lng/long/longitude (case insensitive). Simply provide numeric vectors lng lat arguments Note MULTIPOINT objects sf supported time.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"icon-markers","dir":"Articles","previous_headings":"","what":"Icon Markers","title":"Add markers to leaflet","text":"Icon markers added using addMarkers() addAwesomeMarkers() functions. default appearance dropped pin. layer functions, popup argument can used add message displayed click, label option can used display text label either hover statically.","code":"data(quakes) # Show first 20 rows from the `quakes` dataset leaflet(data = quakes[1:20,]) %>% addTiles() %>% addMarkers(~long, ~lat, popup = ~as.character(mag), label = ~as.character(mag))"},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"customizing-marker-icons","dir":"Articles","previous_headings":"Icon Markers","what":"Customizing Marker Icons","title":"Add markers to leaflet","text":"can provide custom markers one several ways, depending scenario. ways, icon can provided either URL file path. simple case applying single icon set markers, use makeIcon(). several icons apply vary couple parameters (.e., share size anchor points different URLs), use icons() icons() performs similarly data.frame(), arguments shorter number markers recycled fit. Finally, set icons vary multiple parameters, may convenient use iconList(). lets create list (named unnamed) makeIcon() icons, select list position name.","code":"greenLeafIcon <- makeIcon( iconUrl = \"https://leafletjs.com/examples/custom-icons/leaf-green.png\", iconWidth = 38, iconHeight = 95, iconAnchorX = 22, iconAnchorY = 94, shadowUrl = \"https://leafletjs.com/examples/custom-icons/leaf-shadow.png\", shadowWidth = 50, shadowHeight = 64, shadowAnchorX = 4, shadowAnchorY = 62 ) leaflet(data = quakes[1:4,]) %>% addTiles() %>% addMarkers(~long, ~lat, icon = greenLeafIcon) quakes1 <- quakes[1:10,] leafIcons <- icons( iconUrl = ifelse(quakes1$mag < 4.6, \"https://leafletjs.com/examples/custom-icons/leaf-green.png\", \"https://leafletjs.com/examples/custom-icons/leaf-red.png\" ), iconWidth = 38, iconHeight = 95, iconAnchorX = 22, iconAnchorY = 94, shadowUrl = \"https://leafletjs.com/examples/custom-icons/leaf-shadow.png\", shadowWidth = 50, shadowHeight = 64, shadowAnchorX = 4, shadowAnchorY = 62 ) leaflet(data = quakes1) %>% addTiles() %>% addMarkers(~long, ~lat, icon = leafIcons) # Make a list of icons. We'll index into it based on name. oceanIcons <- iconList( ship = makeIcon( \"https://upload.wikimedia.org/wikipedia/commons/thumb/0/0b/Maki2-ferry-18.svg/480px-Maki2-ferry-18.svg.png\", \"https://upload.wikimedia.org/wikipedia/commons/thumb/0/0b/Maki2-ferry-18.svg/18px-Maki2-ferry-18.svg.png\", 18, 18 ), pirate = makeIcon( \"https://upload.wikimedia.org/wikipedia/commons/thumb/c/c3/Maki2-danger-24.svg/240px-Maki2-danger-24.svg.png\", \"https://upload.wikimedia.org/wikipedia/commons/thumb/c/c3/Maki2-danger-24.svg/24px-Maki2-danger-24.svg.png\", 24, 24 ) ) # Some fake data df <- sf::st_as_sf( data.frame( type = factor(ifelse(runif(20) > 0.75, \"pirate\", \"ship\"), c(\"ship\", \"pirate\")), lng = (runif(20) - .5) * 10 - 90.620130, lat = (runif(20) - .5) * 3.8 + 25.638077 ), coords = c(\"lng\", \"lat\"), crs = 4326 ) leaflet(df) %>% addTiles() %>% # Select from oceanIcons based on df$type addMarkers(icon = ~oceanIcons[type])"},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"awesome-icons","dir":"Articles","previous_headings":"Icon Markers","what":"Awesome Icons","title":"Add markers to leaflet","text":"Leaflet supports even customizable markers using awesome markers leaflet plugin. addAwesomeMarkers() function similar addMarkers() function additionally allows specify custom colors markers well icons Font Awesome, Bootstrap Glyphicons, Ion icons icon libraries. Similar makeIcon(), icons(), iconList() described , makeAwesomeIcon(), awesomeIcons() awesomeIconList() functions, enable add awesome icons. library argument one ‘ion’, ‘fa’, ‘glyphicon’. icon argument needs name valid icon supported respective library (w/o prefix library name).","code":"# first 20 quakes df.20 <- quakes[1:20,] getColor <- function(quakes) { sapply(quakes$mag, function(mag) { if(mag <= 4) { \"green\" } else if(mag <= 5) { \"orange\" } else { \"red\" } }) } icons <- awesomeIcons( icon = 'ios-close', iconColor = 'black', library = 'ion', markerColor = getColor(df.20) ) leaflet(df.20) %>% addTiles() %>% addAwesomeMarkers(~long, ~lat, icon=icons, label=~as.character(mag))"},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"marker-clusters","dir":"Articles","previous_headings":"Icon Markers","what":"Marker Clusters","title":"Add markers to leaflet","text":"large number markers map, can cluster using Leaflet.markercluster plug-. enable plug-, can provide list options argument clusterOptions, e.g., Using freezeAtZoom argument markerClusterOptions(), can set clustering freeze specific zoom level. example markerClusterOptions(freezeAtZoom = 5) freeze cluster zoom level 5 regardless user’s actual zoom level.","code":"leaflet(quakes) %>% addTiles() %>% addMarkers( clusterOptions = markerClusterOptions() )"},{"path":"https://rstudio.github.io/leaflet/articles/markers.html","id":"circle-markers","dir":"Articles","previous_headings":"","what":"Circle Markers","title":"Add markers to leaflet","text":"Circle markers much like regular circles (see Lines Shapes), except radius onscreen pixels stays constant regardless zoom level. can use default appearance: customize color, radius, stroke, opacity, etc.","code":"leaflet(df) %>% addTiles() %>% addCircleMarkers() # Create a palette that maps factor levels to colors pal <- colorFactor(c(\"navy\", \"red\"), domain = c(\"ship\", \"pirate\")) leaflet(df) %>% addTiles() %>% addCircleMarkers( radius = ~ifelse(type == \"ship\", 6, 10), color = ~pal(type), stroke = FALSE, fillOpacity = 0.5 )"},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"add-ons","dir":"Articles","previous_headings":"","what":"Add-ons","title":"Additional features","text":"various utility functions can use augment map additional elements. utility function give supports options customization, sure check help files details.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"leaflet-measure","dir":"Articles","previous_headings":"Add-ons","what":"Leaflet Measure","title":"Additional features","text":"can use addMeasure() add leaflet-measure plugin map. Use various options customize appearance behavior plugin (see ?addMeasure details).","code":"library(leaflet) m <- leaflet() %>% addTiles() m %>% # Central Park fitBounds(-73.9, 40.75, -73.95,40.8) %>% addMeasure() m %>% # Berlin, Germany fitBounds(13.76134, 52.675499, 13.0884, 52.33812) %>% addMeasure( position = \"bottomleft\", primaryLengthUnit = \"meters\", primaryAreaUnit = \"sqmeters\", activeColor = \"#3D535D\", completedColor = \"#7D4479\")"},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"graticule","dir":"Articles","previous_headings":"Add-ons","what":"Graticule","title":"Additional features","text":"Use addGraticule() add graticule (grid) map (via Leaflet.Graticule plugin). can use group argument make graticule toggleable.","code":"library(leaflet) m <- leaflet() %>% addTiles() %>% setView(0,0,2) m %>% addGraticule() m %>% addGraticule(interval = 40, style = list(color = \"#FF0000\", weight = 1)) m %>% addGraticule(group = \"Graticule\") %>% addLayersControl(overlayGroups = c(\"Graticule\"), options = layersControlOptions(collapsed = FALSE))"},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"terminator-daynight-indicator","dir":"Articles","previous_headings":"Add-ons","what":"Terminator (day/night indicator)","title":"Additional features","text":"","code":"library(leaflet) # Default Resolution leaflet() %>% addTiles() %>% addTerminator() # Custom Resolution + Custom Date and on a toggleable Layer leaflet() %>% addTiles() %>% addTerminator( resolution=10, time = \"2013-06-20T21:00:00Z\", group = \"daylight\") %>% addLayersControl( overlayGroups = \"daylight\", options = layersControlOptions(collapsed = FALSE))"},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"minimap","dir":"Articles","previous_headings":"Add-ons","what":"Minimap","title":"Additional features","text":"can use addMiniMap() add minimap aid navigation. implemented via Leaflet-MiniMap plugin. Note minimap shows map tiles; markers, polygons, layers main map displayed minimap. can use specific basemap minimap via tiles parameter. example also allows minimap hidden setting toggleDisplay = TRUE.","code":"library(leaflet) l <- leaflet() %>% setView(0,0,3) l %>% addProviderTiles(providers$Esri.WorldStreetMap) %>% addMiniMap() l %>% addProviderTiles(providers$Esri.WorldStreetMap) %>% addMiniMap( tiles = providers$Esri.WorldStreetMap, toggleDisplay = TRUE)"},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"easybutton","dir":"Articles","previous_headings":"Add-ons","what":"EasyButton","title":"Additional features","text":"Use addEasyButton() add simple buttons (via Leaflet.EasyButton) trigger custom JavaScript logic. map adds two buttons: one sets map zoom level 1, attempts locate . next example demonstrates easyButton two distinct states: frozen-markers unfrozen-markers, distinct icon, title, click handler.","code":"library(leaflet) library(htmltools) library(htmlwidgets) leaflet() %>% addTiles() %>% addEasyButton(easyButton( icon=\"fa-globe\", title=\"Zoom to Level 1\", onClick=JS(\"function(btn, map){ map.setZoom(1); }\"))) %>% addEasyButton(easyButton( icon=\"fa-crosshairs\", title=\"Locate Me\", onClick=JS(\"function(btn, map){ map.locate({setView: true}); }\"))) leaflet() %>% addTiles() %>% addMarkers(data=quakes, clusterOptions = markerClusterOptions(), clusterId = \"quakesCluster\") %>% addEasyButton(easyButton( states = list( easyButtonState( stateName=\"unfrozen-markers\", icon=\"ion-toggle\", title=\"Freeze Clusters\", onClick = JS(\" function(btn, map) { var clusterManager = map.layerManager.getLayer('cluster', 'quakesCluster'); clusterManager.freezeAtZoom(); btn.state('frozen-markers'); }\") ), easyButtonState( stateName=\"frozen-markers\", icon=\"ion-toggle-filled\", title=\"UnFreeze Clusters\", onClick = JS(\" function(btn, map) { var clusterManager = map.layerManager.getLayer('cluster', 'quakesCluster'); clusterManager.unfreeze(); btn.state('unfrozen-markers'); }\") ) ) ))"},{"path":[]},{"path":"https://rstudio.github.io/leaflet/articles/morefeatures.html","id":"custom-javascript-with-htmlwidgetsonrender","dir":"Articles","previous_headings":"Advanced Features","what":"Custom JavaScript with htmlwidgets::onRender()","title":"Additional features","text":"htmlwidgets::onRender() can used add custom behavior leaflet map using native JavaScript. advanced use case requires know JavaScript. Using onRender can customize map’s behavior using APIs defined Leaflet.js documentation. example sync base layer mini-map baselayer main map, using ‘baselayerchange’ event.","code":"l <- leaflet() %>% setView(0,0,3) esri <- grep(\"^Esri\", providers, value = TRUE) for (provider in esri) { l <- l %>% addProviderTiles(provider, group = provider) } l %>% addLayersControl(baseGroups = names(esri), options = layersControlOptions(collapsed = FALSE)) %>% addMiniMap(tiles = esri[[1]], toggleDisplay = TRUE, position = \"bottomleft\") %>% htmlwidgets::onRender(\" function(el, x) { var myMap = this; myMap.on('baselayerchange', function (e) { myMap.minimap.changeLayer(L.tileLayer.provider(e.name)); }) }\")"},{"path":"https://rstudio.github.io/leaflet/articles/popups.html","id":"popups","dir":"Articles","previous_headings":"","what":"Popups","title":"Popups and Labels","text":"Popups small boxes containing arbitrary HTML, point specific point map. Use addPopups() function add standalone popup map. common use popups appear markers shapes clicked. Marker shape functions Leaflet package take popup argument, can pass HTML easily attach simple popup. preceding example, htmltools::htmlEscape() used sanitize characters name might interpreted HTML. wasn’t necessary example (restaurant names contained HTML markup), important situation data may come file database, user. addition markers can also add popups shapes like lines, circles polygons.","code":"content <- paste(sep = \"
    \", \"
    Samurai Noodle<\/a><\/b>\", \"606 5th Ave. S\", \"Seattle, WA 98138\" ) leaflet() %>% addTiles() %>% addPopups(-122.327298, 47.597131, content, options = popupOptions(closeButton = FALSE) ) library(htmltools) df <- read.csv(textConnection( \"Name,Lat,Long Samurai Noodle,47.597131,-122.327298 Kukai Ramen,47.6154,-122.327157 Tsukushinbo,47.59987,-122.326726\" )) leaflet(df) %>% addTiles() %>% addMarkers(~Long, ~Lat, popup = ~htmlEscape(Name))"},{"path":"https://rstudio.github.io/leaflet/articles/popups.html","id":"labels","dir":"Articles","previous_headings":"","what":"Labels","title":"Popups and Labels","text":"label textual HTML content can attached markers shapes always displayed displayed mouse . Unlike popups don’t need click marker/polygon label shown.","code":"library(htmltools) df <- read.csv(textConnection( \"Name,Lat,Long Samurai Noodle,47.597131,-122.327298 Kukai Ramen,47.6154,-122.327157 Tsukushinbo,47.59987,-122.326726\")) leaflet(df) %>% addTiles() %>% addMarkers(~Long, ~Lat, label = ~htmlEscape(Name))"},{"path":"https://rstudio.github.io/leaflet/articles/popups.html","id":"customizing-marker-labels","dir":"Articles","previous_headings":"Labels","what":"Customizing Marker Labels","title":"Popups and Labels","text":"can customize marker labels using labelOptions argument addMarkers() function. labelOptions argument can populated using labelOptions() function. noHide false (default) label displayed hover mouse marker; noHide set true label always displayed.","code":"# Change Text Size and text Only and also a custom CSS leaflet() %>% addTiles() %>% setView(-118.456554, 34.09, 13) %>% addMarkers( lng = -118.456554, lat = 34.105, label = \"Default Label\", labelOptions = labelOptions(noHide = TRUE)) %>% addMarkers( lng = -118.456554, lat = 34.095, label = \"Label w/o surrounding box\", labelOptions = labelOptions(noHide = TRUE, textOnly = TRUE)) %>% addMarkers( lng = -118.456554, lat = 34.085, label = \"label w/ textsize 15px\", labelOptions = labelOptions(noHide = TRUE, textsize = \"15px\")) %>% addMarkers( lng = -118.456554, lat = 34.075, label = \"Label w/ custom CSS style\", labelOptions = labelOptions(noHide = TRUE, direction = \"bottom\", style = list( \"color\" = \"red\", \"font-family\" = \"serif\", \"font-style\" = \"italic\", \"box-shadow\" = \"3px 3px rgba(0,0,0,0.25)\", \"font-size\" = \"12px\", \"border-color\" = \"rgba(0,0,0,0.5)\" )))"},{"path":"https://rstudio.github.io/leaflet/articles/popups.html","id":"labels-without-markers","dir":"Articles","previous_headings":"Labels","what":"Labels without markers","title":"Popups and Labels","text":"can create labels without accompanying markers using addLabelOnlyMarkers() function.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/projections.html","id":"defining-a-custom-crs","dir":"Articles","previous_headings":"","what":"Defining a custom CRS","title":"Working with projections in Leaflet","text":"’ve decided custom projection, map tiles match (necessary), can use leafletCRS() create custom projection. crsClass parameter lets specify JavaScript constructor use generate Leaflet.js CRS object. case, ’re using L.Proj.CRS, class comes Proj4Leaflet. (specific list CRS classes can used ; see ?leafletCRS details.) code parameter CRS identifier, usually EPSG identifier similar. (part, doesn’t affect us, can treat like documentation; ’s primarily used Proj4Leaflet purposes don’t apply R package.) proj4def parameter either PROJ.4 WKT string defines CRS. don’t know PROJ.4 WKT string, can generally find epsg.io spatialreference.org. resulting object can passed leaflet function via parameter crs = leafletOptions(crs = ...).","code":"crs <- leafletCRS(crsClass = \"L.Proj.CRS\", code = \"ESRI:102003\", proj4def = \"+proj=aea +lat_1=29.5 +lat_2=45.5 +lat_0=37.5 +lon_0=-96 +x_0=0 +y_0=0 +datum=WGS84 +units=m +no_defs\", resolutions = 1.5^(25:15))"},{"path":"https://rstudio.github.io/leaflet/articles/projections.html","id":"displaying-basemap-tiles-with-custom-projections","dir":"Articles","previous_headings":"","what":"Displaying basemap tiles with custom projections","title":"Working with projections in Leaflet","text":"example shows Gothenberg, Sweden EPSG:3006 (SWEREF99 TM) projection. , ’s critical use basemap tiles projection specified leafletCRS(). case api.geosition.com server indeed uses EPSG:3006 tiles. can render similar map default EPSG:3857 projection comparison. custom projection worked correctly, markers appear position.","code":"epsg3006 <- leafletCRS(crsClass = \"L.Proj.CRS\", code = \"EPSG:3006\", proj4def = \"+proj=utm +zone=33 +ellps=GRS80 +towgs84=0,0,0,0,0,0,0 +units=m +no_defs\", resolutions = 2^(13:-1), # 8192 down to 0.5 origin = c(0, 0) ) tile_url <- \"http://api.geosition.com/tile/osm-bright-3006/{z}/{x}/{y}.png\" tile_attrib <- \"Map data © OpenStreetMap contributors<\/a>, Imagery © 2013 Kartena<\/a>\" leaflet(options = leafletOptions(worldCopyJump = FALSE, crs = epsg3006)) %>% setView(11.965053, 57.70451, 13) %>% addTiles(urlTemplate = tile_url, attribution = tile_attrib, options = tileOptions(minZoom = 0, maxZoom = 14, continuousWorld = TRUE)) %>% addMarkers(11.965053, 57.70451) leaflet() %>% setView(11.965053, 57.70451, 16) %>% addTiles() %>% addMarkers(11.965053, 57.70451)"},{"path":"https://rstudio.github.io/leaflet/articles/projections.html","id":"displaying-shapes-with-custom-projections","dir":"Articles","previous_headings":"","what":"Displaying shapes with custom projections","title":"Working with projections in Leaflet","text":"tiles must projection used leafletCRS(), must always use WGS 84 longitude/latitude data markers, circles, polygons, lines. Leaflet automatically project coordinates displaying. example uses data rnaturalearth package projects EPSG:9311 (US National Atlas Equal Area) coordinate system. Compare first map, uses default CRS, second map, reprojected.","code":"north_america <- rnaturalearth::countries110 |> dplyr::filter(CONTINENT == \"North America\") epsg9311 <- leafletCRS( crsClass = \"L.Proj.CRS\", code = \"EPSG:9311\", proj4def = \"+proj=laea +lat_0=45 +lon_0=-100 +x_0=0 +y_0=0 +a=6370997 +b=6370997 +units=m +no_defs\", resolutions = 2 ^ (16:7) ) pal <- leaflet::colorNumeric(palette = \"viridis\", domain = north_america$POP_EST) plot_na_map <- function(opts = leafletOptions()) { leaflet(north_america, options = opts) %>% addPolygons( weight = 1, color = \"#444444\", opacity = 1, fillColor = ~ pal(POP_EST), fillOpacity = 0.7, smoothFactor = 0.5, label = ~ paste(SOVEREIGNT, POP_EST), labelOptions = labelOptions(direction = \"auto\") ) } plot_na_map() plot_na_map(opts = leafletOptions(crs = epsg9311))"},{"path":"https://rstudio.github.io/leaflet/articles/projections.html","id":"polar-projections","dir":"Articles","previous_headings":"","what":"Polar projections","title":"Working with projections in Leaflet","text":"’s possible use polar projections, though may encounter even problems incompatibilities Leaflet.js plugins using types custom projections.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/raster.html","id":"large-raster-warning","dir":"Articles","previous_headings":"","what":"Large Raster Warning","title":"Raster Images","text":"addRasterImage() embeds image map widget, increase size generated HTML proportionally. order avoid unacceptable download times memory usage, addRasterImage() error PNG beyond size indicated maxBytes argument (defaults 4 megabytes). large raster layer, can provide larger number bytes see goes, use terra::resample() decrease number cells.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/raster.html","id":"projection-performance","dir":"Articles","previous_headings":"","what":"Projection Performance","title":"Raster Images","text":"addRasterImage() projects using terra::project(), can take smallest rasters. large raster layer expect call addRasterImage() raster layer many times, can perform EPSG:3857 projection (either using leaflet::projectRasterForLeaflet() using another GIS library program) call addRasterImage() project = FALSE. sure pre-projected raster layer tagged accurate extent CRS, values still needed place image proper position map.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/raster.html","id":"coloring","dir":"Articles","previous_headings":"","what":"Coloring","title":"Raster Images","text":"order render raster object image, cell value must converted RGB() color. can specify color scale using colors argument, accepts variety color specifications: name Color Brewer 2 palette. colors argument provided, \"Spectral\" default. vector represents ordered list colors map data. color specification accepted grDevices::col2rgb() can used, including \"#RRGGBB\" \"#RRGGBBAA\" forms. Example: colors = c(\"#E0F3DB\", \"#A8DDB5\", \"#43A2CA\"). color scaling function, like detailed Colors topic. example: colors = colorBin(\"Greens\", domain = NULL, bins = 5, na.color = \"transparent\").","code":""},{"path":"https://rstudio.github.io/leaflet/articles/raster.html","id":"example","dir":"Articles","previous_headings":"","what":"Example","title":"Raster Images","text":"","code":"library(terra) library(leaflet) # you can download by accessing https://rstudio.github.io/leaflet/nc/oisst-sst.nc r <- rast(\"nc/oisst-sst.nc\") pal <- colorNumeric(c(\"#0C2C84\", \"#41B6C4\", \"#FFFFCC\"), values(r), na.color = \"transparent\") leaflet() %>% addTiles() %>% addRasterImage(r, colors = pal, opacity = 0.8) %>% addLegend(pal = pal, values = values(r), title = \"Surface temp\")"},{"path":"https://rstudio.github.io/leaflet/articles/shapes.html","id":"polygons-and-polylines","dir":"Articles","previous_headings":"","what":"Polygons and Polylines","title":"Lines and Shapes","text":"Line polygon data can come variety sources: MULTIPOLYGON, POLYGON, MULTILINESTRING, LINESTRING objects (sf package) map objects (maps::map()); use map(fill = TRUE) polygons, FALSE polylines Two-column numeric matrix; first column longitude second latitude. Polygons separated rows (NA, NA). possible represent multi-polygons polygons holes using method; use sf::st_polygon() instead.","code":"# From https://www.census.gov/geo/maps-data/data/cbf/cbf_state.html states <- sf::read_sf(\"shp/cb_2013_us_state_20m.shp\", layer = \"cb_2013_us_state_20m\") neStates <- subset(states, states$STUSPS %in% c( \"CT\",\"ME\",\"MA\",\"NH\",\"RI\",\"VT\",\"NY\",\"NJ\",\"PA\" )) leaflet(neStates) %>% addPolygons(color = \"#444444\", weight = 1, smoothFactor = 0.5, opacity = 1.0, fillOpacity = 0.5, fillColor = ~colorQuantile(\"YlOrRd\", ALAND)(ALAND), highlightOptions = highlightOptions(color = \"white\", weight = 2, bringToFront = TRUE))"},{"path":"https://rstudio.github.io/leaflet/articles/shapes.html","id":"highlighting-shapes","dir":"Articles","previous_headings":"Polygons and Polylines","what":"Highlighting shapes","title":"Lines and Shapes","text":"example uses highlightOptions parameter emphasize currently moused-polygon. (bringToFront = TRUE argument necessary prevent thicker, white border active polygon hidden behind borders polygons happen higher z-order.) can use highlightOptions shape layers described page.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/shapes.html","id":"simplifying-complex-polygonspolylines","dir":"Articles","previous_headings":"Polygons and Polylines","what":"Simplifying complex polygons/polylines","title":"Lines and Shapes","text":"detailed (.e., large) shape data can present problem Leafet, since eventually passed browser rendered SVG, expressive convenient scalability limits. cases, consider using rmapshaper::ms_simplify(), topology-preserving simplification conveniently R.","code":"fullsize <- rnaturalearth::countries110 object.size(fullsize) simplified <- rmapshaper::ms_simplify(fullsize) object.size(simplified)"},{"path":"https://rstudio.github.io/leaflet/articles/shapes.html","id":"circles","dir":"Articles","previous_headings":"","what":"Circles","title":"Lines and Shapes","text":"Circles added using addCircles(). Circles similar circle markers; difference circles radii specified meters, circle markers specified pixels. result, circles scaled map user zooms , circle markers remain constant size screen regardless zoom level. plotting circles, circle centers (radii) required, set valid data sources different polygons markers. See introduction Markers specifics.","code":"cities <- read.csv(textConnection(\" City,Lat,Long,Pop Boston,42.3601,-71.0589,645966 Hartford,41.7627,-72.6743,125017 New York City,40.7127,-74.0059,8406000 Philadelphia,39.9500,-75.1667,1553000 Pittsburgh,40.4397,-79.9764,305841 Providence,41.8236,-71.4222,177994 \")) leaflet(cities) %>% addTiles() %>% addCircles(lng = ~Long, lat = ~Lat, weight = 1, radius = ~sqrt(Pop) * 30, popup = ~City )"},{"path":"https://rstudio.github.io/leaflet/articles/shapes.html","id":"rectangles","dir":"Articles","previous_headings":"","what":"Rectangles","title":"Lines and Shapes","text":"Rectangles added using addRectangles() function. takes lng1, lng2, lat1, lat2 vector arguments define corners rectangles. arguments always required; rectangle geometry inferred data object.","code":"leaflet() %>% addTiles() %>% addRectangles( lng1=-118.456554, lat1=34.078039, lng2=-118.436383, lat2=34.062717, fillColor = \"transparent\" )"},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"modifying-existing-maps-with-leafletproxy","dir":"Articles","previous_headings":"","what":"Modifying Existing Maps with leafletProxy","title":"Using Leaflet with Shiny","text":"works, reactive inputs expressions affect renderLeaflet() expression cause entire map redrawn scratch reset map position zoom level. situations may acceptable desirable behavior. situations, may want finer-grained control map, changing color single polygon adding marker point click – without redrawing entire map. modify map ’s already running page, use leafletProxy() function place leaflet() call, otherwise use Leaflet function calls normal. Normally use leaflet create static aspects map, leafletProxy() manage dynamic elements, like : Besides adding layers, can set map bounds, remove specific objects ID, clear categories layers.","code":"library(shiny) library(leaflet) library(RColorBrewer) ui <- bootstrapPage( tags$style(type = \"text/css\", \"html, body {width:100%;height:100%}\"), leafletOutput(\"map\", width = \"100%\", height = \"100%\"), absolutePanel(top = 10, right = 10, sliderInput(\"range\", \"Magnitudes\", min(quakes$mag), max(quakes$mag), value = range(quakes$mag), step = 0.1 ), selectInput(\"colors\", \"Color Scheme\", rownames(subset(brewer.pal.info, category %in% c(\"seq\", \"div\"))) ), checkboxInput(\"legend\", \"Show legend\", TRUE) ) ) server <- function(input, output, session) { # Reactive expression for the data subsetted to what the user selected filteredData <- reactive({ quakes[quakes$mag >= input$range[1] & quakes$mag <= input$range[2],] }) # This reactive expression represents the palette function, # which changes as the user makes selections in UI. colorpal <- reactive({ colorNumeric(input$colors, quakes$mag) }) output$map <- renderLeaflet({ # Use leaflet() here, and only include aspects of the map that # won't need to change dynamically (at least, not unless the # entire map is being torn down and recreated). leaflet(quakes) %>% addTiles() %>% fitBounds(~min(long), ~min(lat), ~max(long), ~max(lat)) }) # Incremental changes to the map (in this case, replacing the # circles when a new color is chosen) should be performed in # an observer. Each independent set of things that can change # should be managed in its own observer. observe({ pal <- colorpal() leafletProxy(\"map\", data = filteredData()) %>% clearShapes() %>% addCircles(radius = ~10^mag/10, weight = 1, color = \"#777777\", fillColor = ~pal(mag), fillOpacity = 0.7, popup = ~paste(mag) ) }) # Use a separate observer to recreate the legend as needed. observe({ proxy <- leafletProxy(\"map\", data = quakes) # Remove any existing legend, and only if the legend is # enabled, create a new one. proxy %>% clearControls() if (input$legend) { pal <- colorpal() proxy %>% addLegend(position = \"bottomright\", pal = pal, values = ~mag ) } }) } shinyApp(ui, server) proxy <- leafletProxy(\"mymap\") # Fit the view to within these bounds (can also use setView) proxy %>% fitBounds(0, 0, 11, 11) # Create circles with layerIds of \"A\", \"B\", \"C\"... proxy %>% addCircles(1:10, 1:10, layerId = LETTERS[1:10]) # Remove some of the circles proxy %>% removeShape(c(\"B\", \"F\")) # Clear all circles (and other shapes) proxy %>% clearShapes()"},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"understanding-layer-ids","dir":"Articles","previous_headings":"","what":"Understanding Layer IDs","title":"Using Leaflet with Shiny","text":"Layer IDs can used replace remove specific map elements. (Note: managing groups map elements, see Show/Hide Layers topic.) give object layer ID, similar object exists ID, removed map new object added. layer-adding functions take layerId argument. Generally vectorized argument; adding 50 polygons, ’ll need pass either NULL 50-element character vector layerId value. (use single-element character vector layerId, 50 polygons ID, last polygon removed; don’t !) Layer IDs namespaced category. Layer IDs need unique within category; call addCircles() cause tile layers removed, regardless layer ID, circles tiles different categories.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"inputsevents","dir":"Articles","previous_headings":"","what":"Inputs/Events","title":"Using Leaflet with Shiny","text":"Leaflet maps objects send input values (’ll refer “events” document) Shiny user interacts .","code":""},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"object-events","dir":"Articles","previous_headings":"Inputs/Events","what":"Object events","title":"Using Leaflet with Shiny","text":"Object event names generally use pattern: input$MAPID_OBJCATEGORY_EVENTNAME leafletOutput(\"mymap\") circle , clicking circle update Shiny input input$mymap_shape_click. (Note layer ID part name, though part value.) shape ever clicked map, input$mymap_shape_click null. Valid values OBJCATEGORY marker, shape, geojson, topojson. (Tiles controls don’t raise mouse events.) Valid values EVENTNAME click, mouseover, mouseout. events set either NULL event never happened, list() includes: lat - latitude object, available; otherwise, mouse cursor lng - longitude object, available; otherwise, mouse cursor id - layerId, GeoJSON events also include additional properties: featureId - feature ID, properties - feature properties","code":""},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"map-events","dir":"Articles","previous_headings":"Inputs/Events","what":"Map events","title":"Using Leaflet with Shiny","text":"map also input values/events. input$MAPID_click event sent map background basemap clicked. value list lat lng. input$MAPID_bounds provides latitude/longitude bounds currently visible map area; value list() named elements north, east, south, west. input$MAPID_zoom integer indicates zoom level. input$MAPID_center provides latitude/longitude center currently visible map area; value list() named elements lat lng.","code":""},{"path":"https://rstudio.github.io/leaflet/articles/shiny.html","id":"putting-it-all-together","dir":"Articles","previous_headings":"","what":"Putting it all together","title":"Using Leaflet with Shiny","text":"extensive example Shiny Leaflet working together, take look SuperZip Explorer example app (note “Get Code” button top page). (Hint: Try clicking bubbles, also notice plots sidebar change pan zoom around map.)","code":""},{"path":"https://rstudio.github.io/leaflet/articles/showhide.html","id":"understanding-groups","dir":"Articles","previous_headings":"","what":"Understanding Groups","title":"Show/Hide Layers","text":"group label given set layers. assign layers groups using group parameter adding layers map. Many layers can belong group. layer can belong zero one groups (can’t assign layer two groups). Groups Layer IDs may appear similar, used assign name layer. However, differ layer IDs used provide unique identifier individual markers shapes, etc., groups used give shared labels many items. generally provide one group value entire addMarkers() call, can reuse group value future add*() calls add group’s membership (example ). layerId arguments always vectorized: calling e.g., addMarkers() need provide one layer ID per marker, must unique. add circle layer ID \"foo\" later add different shape layer ID, original circle removed.","code":"leaflet() %>% addTiles() %>% addMarkers(data = coffee_shops, group = \"Food & Drink\") %>% addMarkers(data = restaurants, group = \"Food & Drink\") %>% addMarkers(data = restrooms, group = \"Restrooms\")"},{"path":"https://rstudio.github.io/leaflet/articles/showhide.html","id":"interactive-layer-display","dir":"Articles","previous_headings":"","what":"Interactive Layer Display","title":"Show/Hide Layers","text":"can use Leaflet’s layers control feature allow users toggle visibility groups. addLayersControl() distinguishes base groups, can viewed one group time, overlay groups, can individually checked unchecked. Although base groups generally tile layers, overlay groups usually markers shapes, restriction types layers can placed category. one layers control can present map time. call addLayersControl() multiple times, last call win.","code":"outline <- quakes[chull(quakes$long, quakes$lat),] map <- leaflet(quakes) %>% # Base groups addTiles(group = \"OSM (default)\") %>% addProviderTiles(providers$CartoDB.Positron, group = \"Positron (minimal)\") %>% addProviderTiles(providers$Esri.WorldImagery, group = \"World Imagery (satellite)\") %>% # Overlay groups addCircles( ~ long, ~ lat, ~ 10 ^ mag / 5, stroke = FALSE, group = \"Quakes\", fillColor = \"tomato\" ) %>% addPolygons( data = outline, lng = ~ long, lat = ~ lat, fill = FALSE, weight = 2, color = \"#FFFFCC\", group = \"Outline\" ) %>% # Layers control addLayersControl( baseGroups = c( \"OSM (default)\", \"Positron (minimal)\", \"World Imagery (satellite)\" ), overlayGroups = c(\"Quakes\", \"Outline\"), options = layersControlOptions(collapsed = FALSE) ) map"},{"path":"https://rstudio.github.io/leaflet/articles/showhide.html","id":"programmatic-layer-display","dir":"Articles","previous_headings":"","what":"Programmatic Layer Display","title":"Show/Hide Layers","text":"can use showGroup() hideGroup() show hide groups code. mostly makes sense Shiny context leafletProxy, perhaps might toggle group visibility based input controls sidebar. can also use showGroup()/hideGroup() conjunction addLayersControl() set groups checked default. Finally, can remove layers group using clearGroup(). Note doesn’t just remove layers group, also removes map. (, however, remove group map; still exists, empty.)","code":"map %>% hideGroup(\"Outline\")"},{"path":"https://rstudio.github.io/leaflet/articles/showhide.html","id":"with-marker-clusters","dir":"Articles","previous_headings":"","what":"With Marker Clusters","title":"Show/Hide Layers","text":"markers added different groups, using marker clustering described marker page, leaflet generate different sets clusters different groups. allows showing/hiding marker clusters belonging group independently marker clusters groups.","code":"quakes <- quakes %>% dplyr::mutate(mag.level = cut(mag,c(3,4,5,6), labels = c('>3 & <=4', '>4 & <=5', '>5 & <=6'))) quakes.df <- split(quakes, quakes$mag.level) l <- leaflet() %>% addTiles() names(quakes.df) %>% purrr::walk( function(df) { l <<- l %>% addMarkers(data=quakes.df[[df]], lng=~long, lat=~lat, label=~as.character(mag), popup=~as.character(mag), group = df, clusterOptions = markerClusterOptions(removeOutsideVisibleBounds = FALSE), labelOptions = labelOptions(noHide = FALSE, direction = 'auto')) }) l %>% addLayersControl( overlayGroups = names(quakes.df), options = layersControlOptions(collapsed = FALSE) )"},{"path":"https://rstudio.github.io/leaflet/articles/widget.html","id":"initializing-options","dir":"Articles","previous_headings":"","what":"Initializing Options","title":"The Map Widget","text":"map widget can initialized certain parameters. achieved populating options argument shown . leafletOptions() can passed option described leaflet reference document. Using leafletOptions(), can set custom CRS map displayed non spherical Mercator projection described projections.","code":"# Set value for the minZoom and maxZoom settings. leaflet(options = leafletOptions(minZoom = 0, maxZoom = 18))"},{"path":"https://rstudio.github.io/leaflet/articles/widget.html","id":"map-methods","dir":"Articles","previous_headings":"","what":"Map Methods","title":"The Map Widget","text":"can manipulate attributes map widget using series methods. Please see help page ?setView details. setView() sets center map view zoom level; fitBounds() fits view rectangle [lng1, lat1] – [lng2, lat2]; clearBounds() clears bound, view automatically determined range latitude/longitude data map layers provided;","code":""},{"path":"https://rstudio.github.io/leaflet/articles/widget.html","id":"the-data-object","dir":"Articles","previous_headings":"","what":"The Data Object","title":"The Map Widget","text":"leaflet() map layer functions optional data parameter designed receive spatial data one several forms: lng/lat matrix data frame lng/lat columns data frame returned map() Simple features sf package. leaflet() , additionally, back-compatible sp SpatailDataFrames, although use discouraged new users. data argument used derive spatial data functions need ; example, data sf Simple Features data.frame, calling addPolygons() map widget know add polygons geometry column. straightforward derive variables sf objects since always represent spatial data way. hand, normal matrix data frame, numeric column potentially contain spatial data. resort guessing based column names: latitude variable guessed looking columns named lat latitude (case-insensitive) longitude variable guessed looking lng, long, longitude can always explicitly identify latitude/longitude columns providing lng lat arguments layer function. example, specify values arguments lat lng addCircles() , columns Lat Long data frame df automatically used: can also explicitly specify Lat Long columns (see info ~ syntax): map layer may use different data object override data provided leaflet(). can rewrite example : examples using sf {maps}, respectively:","code":"# add some circles to a map df = data.frame(Lat = 1:10, Long = rnorm(10)) leaflet(df) %>% addCircles() leaflet(df) %>% addCircles(lng = ~Long, lat = ~Lat) leaflet() %>% addCircles(data = df) leaflet() %>% addCircles(data = df, lat = ~ Lat, lng = ~ Long) library(sf) polygon1 <- st_polygon(list(cbind(c(2, 4, 4, 1, 2), c(2, 3, 5, 4, 2)))) polygon2 <- st_polygon(list(cbind(c(5, 4, 2, 5), c(2, 3, 2, 2)))) polygon3 <- st_polygon(list(cbind(c(4, 4, 5, 10, 4), c(5, 3, 2, 5, 5)))) polygon4 <- st_polygon(list(cbind(c(5, 6, 6, 5, 5), c(4, 4, 3, 3, 4)))) multi_polygon <- st_multipolygon(list( list(cbind(c(4, 4, 5, 10, 4), c(5, 3, 2, 5, 5))), list(cbind(c(5, 6, 6, 5, 5), c(4, 4, 3, 3, 4))) )) sf_polygons <- st_sf(geometry = st_sfc(polygon1, polygon2, multi_polygon)) leaflet(height = \"300px\") %>% addPolygons(data = sf_polygons) library(maps) mapStates = map(\"state\", fill = TRUE, plot = FALSE) leaflet(data = mapStates) %>% addTiles() %>% addPolygons(fillColor = topo.colors(10, alpha = NULL), stroke = FALSE)"},{"path":"https://rstudio.github.io/leaflet/articles/widget.html","id":"the-formula-interface","dir":"Articles","previous_headings":"","what":"The Formula Interface","title":"The Map Widget","text":"arguments layer functions can take normal R objects, numeric vector lat argument, character vector colors color argument. can also take one-sided formula, case formula evaluated using data argument environment. example, ~ x means variable x data object, can write arbitrary expressions right-hand side, e.g., ~ sqrt(x + 1).","code":"m = leaflet() %>% addTiles() df = data.frame( lat = rnorm(100), lng = rnorm(100), size = runif(100, 5, 20), color = sample(colors(), 100) ) m = leaflet(df) %>% addTiles() m %>% addCircleMarkers(radius = ~size, color = ~color, fill = FALSE) m %>% addCircleMarkers(radius = runif(100, 4, 10), color = c('red'))"},{"path":"https://rstudio.github.io/leaflet/authors.html","id":null,"dir":"","previous_headings":"","what":"Authors","title":"Authors and Citation","text":"Joe Cheng. Author, maintainer. Barret Schloerke. Author. Bhaskar Karambelkar. Author. Yihui Xie. Author. Hadley Wickham. Contributor. Kenton Russell. Contributor. Kent Johnson. Contributor. Vladimir Agafonkin. Contributor, copyright holder. Leaflet library CloudMade. Copyright holder. Leaflet library Leaflet contributors. Contributor. Leaflet library Brandon Copeland. Contributor, copyright holder. leaflet-measure plugin Joerg Dietrich. Contributor, copyright holder. Leaflet.Terminator plugin Benjamin Becquet. Contributor, copyright holder. Leaflet.MagnifyingGlass plugin Norkart . Contributor, copyright holder. Leaflet.MiniMap plugin L. Voogdt. Contributor, copyright holder. Leaflet.awesome-markers plugin Daniel Montague. Contributor, copyright holder. Leaflet.EasyButton plugin Kartena AB. Contributor, copyright holder. Proj4Leaflet plugin Robert Kajic. Contributor, copyright holder. leaflet-locationfilter plugin Mapbox. Contributor, copyright holder. leaflet-omnivore plugin Michael Bostock. Contributor, copyright holder. topojson . Copyright holder, funder.","code":""},{"path":"https://rstudio.github.io/leaflet/authors.html","id":"citation","dir":"","previous_headings":"","what":"Citation","title":"Authors and Citation","text":"Cheng J, Schloerke B, Karambelkar B, Xie Y (2024). leaflet: Create Interactive Web Maps JavaScript 'Leaflet' Library. R package version 2.2.2.9000, https://github.com/rstudio/leaflet, https://rstudio.github.io/leaflet/.","code":"@Manual{, title = {leaflet: Create Interactive Web Maps with the JavaScript 'Leaflet' Library}, author = {Joe Cheng and Barret Schloerke and Bhaskar Karambelkar and Yihui Xie}, year = {2024}, note = {R package version 2.2.2.9000, https://github.com/rstudio/leaflet}, url = {https://rstudio.github.io/leaflet/}, }"},{"path":"https://rstudio.github.io/leaflet/index.html","id":"an-r-interface-to-leaflet-maps","dir":"","previous_headings":"","what":"Create Interactive Web Maps with the JavaScript Leaflet Library","title":"Create Interactive Web Maps with the JavaScript Leaflet Library","text":"Leaflet open-source JavaScript library interactive maps. R package makes easy create Leaflet maps R.","code":"library(leaflet) m = leaflet() %>% addTiles() m # a map with the default OSM tile layer m = m %>% setView(-93.65, 42.0285, zoom = 17) m m %>% addPopups(-93.65, 42.0285, 'Here is the Department of Statistics<\/b>, ISU')"},{"path":"https://rstudio.github.io/leaflet/index.html","id":"installation","dir":"","previous_headings":"","what":"Installation","title":"Create Interactive Web Maps with the JavaScript Leaflet Library","text":"can install package CRAN, development version GitHub:","code":"# CRAN version install.packages('leaflet') # Or Github version if (!require('devtools')) install.packages('devtools') devtools::install_github('rstudio/leaflet')"},{"path":"https://rstudio.github.io/leaflet/index.html","id":"documentation","dir":"","previous_headings":"","what":"Documentation","title":"Create Interactive Web Maps with the JavaScript Leaflet Library","text":"addition usual R package documentation, also extensive docs examples : https://rstudio.github.io/leaflet/","code":""},{"path":"https://rstudio.github.io/leaflet/index.html","id":"development","dir":"","previous_headings":"","what":"Development","title":"Create Interactive Web Maps with the JavaScript Leaflet Library","text":"leaflet’s JavaScript build tools use Node.js, along yarn manage JavaScript packages. Install yarn using official instructions. can test Node.js yarn installed properly running following commands: make additions modifications JavaScript htmlwidgets binding layer, must Node.js dependencies installed. Now can build/minify/lint/test using yarn build, run “watch” mode just running yarn watch. JS sources go javascript/src tests go javascript/tests.","code":"node --version yarn --version # install dependencies yarn # compile yarn build # watch yarn watch"},{"path":"https://rstudio.github.io/leaflet/index.html","id":"license","dir":"","previous_headings":"","what":"License","title":"Create Interactive Web Maps with the JavaScript Leaflet Library","text":"package licensed terms GNU General Public License version 3 later. Copyright 2013-2015 RStudio, Inc.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/aaa-test-viztest.html","id":null,"dir":"Reference","previous_headings":"","what":"Visual Testing scripts for vistest — aaa-test-viztest","title":"Visual Testing scripts for vistest — aaa-test-viztest","text":"Visual testing examples used vistest package.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/aaa-test-viztest.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Visual Testing scripts for vistest — aaa-test-viztest","text":"","code":"# \\donttest{ ### Start addGeoJSON properties - https://github.com/rstudio/leaflet/pull/625 polygon = list( type = \"Polygon\", coordinates = list( list( c(8.330469, 48.261570), c(8.339052, 48.261570), c(8.339052, 48.258227), c(8.330469, 48.258227), c(8.330469, 48.261570) ) ) ) # should produce an orange-ish rectangle around `Ramsel` leaflet() %>% addTiles() %>% addGeoJSON(polygon, color=\"#F00\") %>% setView(lng = 8.330469, lat = 48.26157, zoom = 15) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addGeoJSON\",\"args\":[{\"type\":\"Polygon\",\"coordinates\":[[[8.330469000000001,48.26157],[8.339052000000001,48.26157],[8.339052000000001,48.258227],[8.330469000000001,48.258227],[8.330469000000001,48.26157]]]},null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#F00\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#F00\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false}]}],\"setView\":[[48.26157,8.330469000000001],15,[]]},\"evals\":[],\"jsHooks\":[]}### End PR #625 # } # end donttest"},{"path":"https://rstudio.github.io/leaflet/reference/addAwesomeMarkers.html","id":null,"dir":"Reference","previous_headings":"","what":"Add Awesome Markers — addAwesomeMarkers","title":"Add Awesome Markers — addAwesomeMarkers","text":"Add Awesome Markers","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addAwesomeMarkers.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add Awesome Markers — addAwesomeMarkers","text":"","code":"addAwesomeMarkers( map, lng = NULL, lat = NULL, layerId = NULL, group = NULL, icon = NULL, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = markerOptions(), clusterOptions = NULL, clusterId = NULL, data = getMapData(map) )"},{"path":"https://rstudio.github.io/leaflet/reference/addAwesomeMarkers.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add Awesome Markers — addAwesomeMarkers","text":"map map add awesome Markers . lng numeric vector longitudes, one-sided formula form ~x x variable data; default (explicitly provided), automatically inferred data looking column named lng, long, longitude (case-insensitively) lat vector latitudes formula (similar lng argument; names lat latitude used guessing latitude column data) layerId layer id group name group newly created layers belong (clearGroup() addLayersControl() purposes). Human-friendly group names permitted–need short, identifier-style names. number layers even different types layers (e.g., markers polygons) can share group name. icon icon(s) markers; popup character vector HTML content popups (recommended escape text using htmltools::htmlEscape() security reasons) popupOptions Vector popupOptions() provide popups label character vector HTML content labels labelOptions Vector labelOptions() provide label options label. Default NULL options list extra options tile layers, popups, paths (circles, rectangles, polygons, ...), map elements clusterOptions NULL, markers clustered using Leaflet.markercluster; can use markerClusterOptions() specify marker cluster options clusterId id marker cluster layer data data object argument values derived; default, data object provided leaflet() initially, can overridden","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addGraticule.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a Graticule on the map — addGraticule","title":"Add a Graticule on the map — addGraticule","text":"Add Graticule map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addGraticule.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a Graticule on the map — addGraticule","text":"","code":"addGraticule( map, interval = 20, sphere = FALSE, style = list(color = \"#333\", weight = 1), layerId = NULL, group = NULL, options = pathOptions(pointerEvents = \"none\", clickable = FALSE) )"},{"path":"https://rstudio.github.io/leaflet/reference/addGraticule.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a Graticule on the map — addGraticule","text":"map map widget object interval spacing map units horizontal vertical lines. sphere boolean. Default FALSE style path options generated lines. See https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#path-option layerId layer id group name group layer belongs . options path options graticule layer","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/addGraticule.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a Graticule on the map — addGraticule","text":"","code":"leaf <- leaflet() %>% addTiles() %>% addGraticule() leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addGraticule\",\"args\":[20,false,{\"color\":\"#333\",\"weight\":1},null,null,{\"interactive\":false,\"pointerEvents\":\"none\",\"className\":\"\"}]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addLayersControl.html","id":null,"dir":"Reference","previous_headings":"","what":"Add UI controls to switch layers on and off — addLayersControl","title":"Add UI controls to switch layers on and off — addLayersControl","text":"Uses Leaflet's built-layers control feature allow users choose one several base layers, choose number overlay layers view.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addLayersControl.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add UI controls to switch layers on and off — addLayersControl","text":"","code":"addLayersControl( map, baseGroups = character(0), overlayGroups = character(0), position = c(\"topright\", \"bottomright\", \"bottomleft\", \"topleft\"), options = layersControlOptions(), data = getMapData(map) ) layersControlOptions(collapsed = TRUE, autoZIndex = TRUE, ...) removeLayersControl(map)"},{"path":"https://rstudio.github.io/leaflet/reference/addLayersControl.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add UI controls to switch layers on and off — addLayersControl","text":"map map add layers control baseGroups character vector element name group. user able choose one base group () time. commonly used mostly-opaque tile layers. overlayGroups character vector element name group. user can turn overlay group independently. position position control: \"topleft\", \"topright\", \"bottomleft\", \"bottomright\". options list additional options, intended provided call layersControlOptions() data data object argument values derived; default, data object provided leaflet() initially, can overridden collapsed TRUE (default), layers control rendered icon expands hovered . Set FALSE layers control always appear expanded state. autoZIndex TRUE, control automatically maintain z-order various groups overlays switched . ... options layersControlOptions()","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addLayersControl.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add UI controls to switch layers on and off — addLayersControl","text":"","code":"# \\donttest{ leaflet() %>% addTiles(group = \"OpenStreetMap\") %>% addProviderTiles(\"CartoDB.Voyager\", group = \"Carto Voyager\") %>% addMarkers(runif(20, -75, -74), runif(20, 41, 42), group = \"Markers\") %>% addLayersControl( baseGroups = c(\"OpenStreetMap\", \"Carto Voyager\"), overlayGroups = c(\"Markers\") ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,\"OpenStreetMap\",{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addProviderTiles\",\"args\":[\"CartoDB.Voyager\",null,\"Carto Voyager\",{\"errorTileUrl\":\"\",\"noWrap\":false,\"detectRetina\":false}]},{\"method\":\"addMarkers\",\"args\":[[41.28989229537547,41.67838042741641,41.73531959881075,41.19595673307776,41.98053967463784,41.74152152915485,41.05144627625123,41.53021246357821,41.69582387898117,41.68855600338429,41.03123032534495,41.22556253452785,41.30083080613986,41.63646561489441,41.47902454971336,41.43217125814408,41.70643383776769,41.94857657630928,41.18033876805566,41.21689987648278],[-74.91924986243248,-74.16566696274094,-74.39923911378719,-74.84279155847616,-74.99260055879131,-74.53360650269315,-74.50222261133604,-74.7102327554021,-74.26711801299825,-74.22747848881409,-74.12539933924563,-74.82505937316455,-74.96575866732746,-74.67961426917464,-74.59767176164314,-74.80433016526513,-74.59646188258193,-74.93633854272775,-74.61129868682474,-74.02445216476917],null,null,\"Markers\",{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"addLayersControl\",\"args\":[[\"OpenStreetMap\",\"Carto Voyager\"],\"Markers\",{\"collapsed\":true,\"autoZIndex\":true,\"position\":\"topright\"}]}],\"limits\":{\"lat\":[41.03123032534495,41.98053967463784],\"lng\":[-74.99260055879131,-74.02445216476917]}},\"evals\":[],\"jsHooks\":[]}# }"},{"path":"https://rstudio.github.io/leaflet/reference/addLegend.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a color legend to a map — addLegend","title":"Add a color legend to a map — addLegend","text":"color palette function used map (e.g., colorNumeric()), color legend can automatically derived palette function. can also manually specify colors labels legend.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addLegend.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a color legend to a map — addLegend","text":"","code":"addLegend( map, position = c(\"topright\", \"bottomright\", \"bottomleft\", \"topleft\"), pal, values, na.label = \"NA\", bins = 7, colors, opacity = 0.5, labels = NULL, labFormat = labelFormat(), title = NULL, className = \"info legend\", layerId = NULL, group = NULL, data = getMapData(map) ) labelFormat( prefix = \"\", suffix = \"\", between = \" – \", digits = 3, big.mark = \",\", transform = identity )"},{"path":"https://rstudio.github.io/leaflet/reference/addLegend.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a color legend to a map — addLegend","text":"map map widget object created leaflet() position position legend pal color palette function, generated colorNumeric(), colorBin(), colorQuantile(), colorFactor() values values used generate colors palette function na.label legend label NAs values bins approximate number tick-marks color gradient colorNumeric palette length one; can also provide numeric vector pre-defined breaks (equally spaced) colors vector (HTML) colors used legend pal provided opacity opacity colors labels vector text labels legend corresponding colors labFormat function format labels derived pal values (see Details know labelFormat() returns default; can either use helper function labelFormat(), write function) title legend title className extra CSS classes append control, space separated layerId ID legend; subsequent calls addLegend() addControl() layerId replace legend. ID can also used removeControl(). group group name leaflet layer group. Supplying value tie legend leaflet layer group name auto add/remove legend group added/removed, example via layerControl(). need set group add layer (e.g., addPolygons()) supply name . data data object argument values derived; default, data object provided leaflet() initially, can overridden prefix prefix legend labels suffix suffix legend labels separator x[] x[+ 1] legend labels (default, dash) digits number digits numeric values labels big.mark thousand separator transform function transform label value","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addLegend.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Add a color legend to a map — addLegend","text":"labFormat argument function takes argument type = c(\"numeric\", \"bin\", \"quantile\", \"factor\"), plus, arguments different types color palettes. colorNumeric() palette, labFormat takes single argument, breaks numeric vector, returns character vector length. colorBin(), labFormat also takes vector breaks length n return character vector length n - 1, -th element representing interval c(x[], x[+ 1]). colorQuantile(), labFormat takes two arguments, quantiles associated probabilities (length n), return character vector length n - 1 (similar colorBin() palette). colorFactor(), labFormat takes one argument, unique values factor, return character vector length. default, labFormat basically format(scientific = FALSE, big.mark = \",\") numeric palette, .character() factor palette, function return labels form x[] - x[+ 1] bin quantile palettes (case quantile palettes, x probabilities instead values breaks).","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addLegend.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a color legend to a map — addLegend","text":"","code":"# !formatR library(leaflet) # a manual legend leaflet() %>% addTiles() %>% addLegend( position = \"bottomright\", colors = rgb(t(col2rgb(palette())) / 255), labels = palette(), opacity = 1, title = \"An Obvious Legend\" ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addLegend\",\"args\":[{\"colors\":[\"#000000\",\"#DF536B\",\"#61D04F\",\"#2297E6\",\"#28E2E5\",\"#CD0BBC\",\"#F5C710\",\"#9E9E9E\"],\"labels\":[\"black\",\"#DF536B\",\"#61D04F\",\"#2297E6\",\"#28E2E5\",\"#CD0BBC\",\"#F5C710\",\"gray62\"],\"na_color\":null,\"na_label\":\"NA\",\"opacity\":1,\"position\":\"bottomright\",\"type\":\"unknown\",\"title\":\"An Obvious Legend\",\"extra\":null,\"layerId\":null,\"className\":\"info legend\",\"group\":null}]}]},\"evals\":[],\"jsHooks\":[]} # \\donttest{ # an automatic legend derived from the color palette df <- local({ n <- 300; x <- rnorm(n); y <- rnorm(n) z <- sqrt(x ^ 2 + y ^ 2); z[sample(n, 10)] <- NA data.frame(x, y, z) }) pal <- colorNumeric(\"OrRd\", df$z) leaflet(df) %>% addTiles() %>% addCircleMarkers(~x, ~y, color = ~pal(z), group = \"circles\") %>% addLegend(pal = pal, values = ~z, group = \"circles\", position = \"bottomleft\") %>% addLayersControl(overlayGroups = c(\"circles\")) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[0.6505335516663909,0.3439133370803937,1.477532312122079,0.07202569848562312,2.126444534053145,-1.476196905665011,0.4078884997730672,1.393977798163443,0.3602782963824587,0.654550251367236,1.052155421638391,-1.979555125375499,1.208385605077569,-0.1692800840101273,0.2950297525088386,1.266340586731399,-1.135343256731542,-1.131053798136733,0.1099933842482332,0.8529054098496378,-0.2343378617328363,2.086688567419564,-0.1109193711378142,-1.392847056486805,-1.142290768301507,1.704608737476107,-0.08007363420444615,-0.4372812395618814,-0.1192150943099993,0.7864628648871801,-0.578945246005208,-0.1454268853396554,0.5264579905303892,1.733578109587555,1.448657219890587,1.518193149429752,-0.3840072542956225,1.827125177326342,-0.5514917498897072,-0.8657535409638455,-0.3438314805274069,1.062876458408378,0.8130582039749211,1.803483360509342,-0.1050686940262848,0.98245336219486,-1.713302622089714,-0.8320195265654265,1.100491881658022,-0.1738201059067313,0.1788120182760854,-0.6984294493425443,-0.9604491590301349,-0.97542304241414,-0.3385765031429888,1.152347074186777,0.4051011834930712,-0.4709224972691391,-0.1332510187207652,1.226682355623377,0.3329439951460119,-0.3470884662878682,-0.09855069024628586,0.03476605997672152,0.386127021879785,0.02083122824075784,0.007586777029884506,0.930844030400638,-0.6847499412558499,0.3374015128989138,-0.4121377037330259,0.9342611301961558,1.840316740968912,-0.7048196633302973,0.008510312347171704,2.034189886387702,-1.341686068324058,1.158979182334556,-0.2032089577553381,-0.3780285548642988,1.736111042681378,-0.8452478159400637,-0.9615714932597695,1.01749105255407,-1.496053742070577,-1.184818729878542,0.6302343731964918,2.101252513811306,-0.6137368097381497,-1.634638271926792,-0.01044111669616038,-0.6565061387600695,-0.6695334414548653,-0.4785890275037744,1.319456316497346,0.6365627611607734,0.5143277816931332,-1.75137511333889,0.8935975183721073,0.223038372343281,0.5808165932265656,-0.1778214210556546,0.7409667077822469,-0.9974430787594897,-2.938977561072442,0.7190156610442144,-0.6980050412308539,-1.894125843416095,0.07629924890404224,0.8753085008667204,0.4538273928547277,-0.8507169060610854,0.5662016125567449,1.152211954306609,-0.7561973771310204,-0.4892583340844989,-1.166052336594417,-0.4796689501890092,0.1153482175160142,-1.768048406882717,-1.407638918566151,0.7091784609457917,-1.240842940399721,-0.3683273481213414,0.4620800934471069,-0.3228331006706945,-1.287214809847799,-1.030040246855714,1.514089316331298,0.3469035861511874,1.779441541548383,0.3866309242205058,-0.9186952386197336,-1.584336488240057,-0.084058892399114,-2.085070889151488,0.003567991787201713,-0.355770822296309,1.146359751427157,-0.2211884456264634,1.018179020928247,-0.2637192952328821,1.658542304551605,-0.7740867711750815,-0.9239378800876532,-0.2755333776535783,-0.5933996879968637,-0.1222858911464302,1.179784246068877,0.6410373738209756,-0.6295885083684619,-0.8077349712069041,-0.8604899291575122,-2.16923869330458,-1.375836518354382,-0.4931324720727169,-0.5816520267788866,-0.1672293036420109,0.4859931285030712,-1.333395795997445,-0.2619656249251471,0.6523863025596753,0.7488549707455571,0.8965602854300257,1.489300423558251,-0.6594034811959866,0.5372831789200957,0.746803066897829,1.896317084370534,-2.0600707247633,0.06454387046377778,-0.2651474026374209,-0.4473445311520631,-1.410700926985981,-0.5064188824072395,-0.2697618382139775,-1.085154917623207,0.3621591266320203,-0.3356721426325846,1.363804497533668,-0.7115241362918345,0.6621787965713957,0.2911302230140996,0.1979580003853844,-1.203566106356997,-0.03981704378226512,0.6869824649050091,0.705267006543464,0.9914416799979249,1.144248971435072,-1.238910242650941,2.654898332699442,-0.1569171888574195,-0.4234901170745928,-0.1983870584249001,-0.8948024072227327,0.9042691190431756,0.07964920984534384,-1.258827222962834,1.025685106130799,-0.7307786028097205,-0.1901455074993663,0.5288646933499248,0.5502105345322271,0.5496843365697919,-0.6595423716192781,0.0574217063913861,-2.808010508303309,-0.9122597530905465,-0.782379162703709,-0.6641049243406778,0.6263097696416825,-0.5072482060373515,0.2703613349062201,0.4674768647758839,0.7239949575018431,0.6138369385442269,-0.6178692021819572,0.2207249020696187,1.127926598212154,1.813454336179437,-0.08382568484351753,1.367706666002093,-0.627434620111653,-0.2166291499658856,-0.6837138237264272,-0.4447027339757115,0.6064898064006521,0.6241830746378563,-0.6954310738216589,-0.783639077924157,-0.953123859114486,1.792756071394783,0.3489766963273593,0.2591037678253732,-0.8059518969450901,0.1056647011829329,-0.3335996818106244,1.641847970388761,-0.6439058589480844,0.5870205615919971,-0.1504030875803916,-1.710821847844759,1.431032557930156,-2.645212268017654,-1.032457405437779,-0.7074664305555289,-0.7005600138809843,0.5378854388923792,-0.3163321749851825,-0.8396227542924231,-1.354928061563667,-0.8175682718860641,-0.634400003317215,0.8159494326259117,0.3027957064724629,1.807086624720854,-0.8940267556963469,-0.04642821127510827,-0.4711791375412447,-0.5266926303512832,-0.09513490757602368,-2.49536480915438,0.1668892166323685,0.3504923837028274,1.433701009281874,0.7659068025325554,1.167520669842047,-0.1369434285990991,-0.514902043516776,1.519744468347238,-0.3284916776050828,-0.05367150615080171,-0.5635246348339656,-0.7439089627975433,-0.109041651464962,-0.5608292270314029,0.1880015489639772,0.7488509422673059,-1.916538316499208,0.2360958467590485,0.6289534152439918,0.4179256757377173,1.976758476646552,-0.5062862982295411,-1.109968852679318,-0.9487057228869408,0.4768437567160564,-0.7952015604742242,0.2343269225062964,-1.222451097219617,-2.453647353884026,-1.489260813902866,-0.4321477341346315,-0.9425540060913923,-0.1214507994148979,1.336446797920755,-0.8603561817741221,0.6665378197568235,-1.421534745704272],[0.4681544204505332,0.3629512558649863,-1.304543545034777,0.7377763212550469,1.888504929234545,-0.09744510440820592,-0.935847353500678,-0.01595031125053767,-0.8267889537334427,-1.512399651262802,0.9353631898010852,0.1764886105624587,0.2436854647462048,1.623548883443603,0.1120380828697629,-0.1339970130625548,-1.910087467722212,-0.2792372415848446,-0.3134459782578902,1.067307878761509,0.07003485029663825,-0.6391233238856642,-0.04996489904814528,-0.2514834432502139,0.4447971157927279,2.755417575336856,0.04653138044419327,0.5777090693066309,0.1181948744096827,-1.911720491028202,0.8620864818385676,-0.2432367396334755,-0.2060871947815807,0.01917759220914627,0.02956075431976639,0.5498275418016892,-2.27411485689294,2.682557183556348,-0.3612212554937149,0.2133557497100296,1.074345882259687,-0.6650882485455054,1.113952418969221,-0.2458964116791525,-1.177563308943281,-0.9758506161598627,1.065057320027152,0.1316706347728944,0.4886288092009806,-1.699450567845694,-1.470736306377429,0.284150343626922,1.337320413235585,0.2366962832865029,1.318293384034629,0.523909787501208,0.6067480465571182,-0.1099356721448703,0.1721817154109998,-0.09032728700066237,1.924343341357788,1.298392758830878,0.7487912675368434,0.5562243291042956,-0.5482572637388645,1.110534892581847,-2.612334332884302,-0.1556937762300525,0.4338897899172486,-0.3819511118161664,0.424187574547461,1.063101995848779,1.048712619755727,-0.03810289481312842,0.4861489195152453,1.672882610832484,-0.3543611635564431,0.9463478864665497,1.316826356044166,-0.2966400245918269,-0.3872135752484032,-0.7854326557803378,-1.056736866993165,-0.7955414295478087,-1.75627542817088,-0.6905378968217506,-0.5585419942187778,-0.5366633264973131,0.2271271327282389,0.9784549202432402,-0.2088826513518269,-1.399410460011772,0.2585372879085119,-0.4417994529113526,0.5685998612153402,2.126850459034092,0.4248584413142624,-1.684281532249712,0.2494017839693337,1.072838251816417,2.039369262502845,0.44945377806039,1.391814045638341,0.4265665469035525,0.1075839922136646,0.02229473312834223,0.6036110105071092,-0.2626505728493916,-0.5282640823709871,0.192149422037578,-1.146199668992958,0.8461846647976611,0.08171962925155422,-1.305117009935323,-0.9449120599497581,0.4543415943151341,-0.8552025008083601,-0.286895218789768,0.8949616255194962,0.06730443969208399,-0.1626763372062715,-0.8273101693111616,1.876505621025494,0.7664401988790351,0.9799566955863486,1.321780991628453,-1.119710828611191,0.5145998185396484,-1.509099835769665,1.532741480322484,0.4291473711320516,0.1221034144722543,-1.138012400593859,-0.5580151294182988,1.052538536901614,0.6776836443013914,0.03849954706442122,-0.3563811870040085,0.7828441018398227,0.8044116161292381,-1.900060823356954,0.9357842861588199,-0.309051503430768,0.2630666769626157,-1.790591855858061,-0.7882588446129118,-1.133021668720607,0.3636525683732274,-0.2858879143030657,0.5176691339974225,-0.1029086701191043,-0.9740695932654561,1.270672300795927,0.9608647870777737,0.7687213695941441,1.035930771080959,-0.4738870742730695,-1.275334874636281,-0.3056206738296712,2.211769486838729,-1.041668380878399,-1.146523850214245,-1.675327303364422,1.525938655037313,0.554185514898162,1.993110264862642,-0.1541207395561243,2.564408337997415,1.061999144545892,1.142694878429166,1.123838843262287,-0.3970014930596247,-0.8232611505671266,-0.5788846247120997,1.763789377571501,0.1329921464040768,0.376499328478288,1.138707653403021,1.24126307530705,0.6120909449591372,-0.4293800871157708,1.360461326770395,-0.07085743067700484,-0.2721536843207814,-2.446680029212921,0.06548664141022381,-1.098508901825947,-0.6331781755248498,-2.063654450538815,2.648932028562412,-1.153398386456107,-0.3406378760312316,0.7863625763097764,-1.270513110211809,0.5421415494418939,0.07510590016820631,0.5585144216644959,0.415406398921884,-1.452299768865976,0.9412061217015445,-0.3389358717098562,-0.07557424745070103,0.04020439205042322,0.1243010661274679,-0.998432550587131,1.233390064881899,0.3404244875613024,-0.472702482118151,0.7087530605311343,-1.528958714659617,0.2374253451731978,-1.3128142464708,0.7470285870863597,-1.562518434645852,0.07105335956777852,-0.6395347702069698,-0.8451957385518639,0.6752446980817243,1.153375793925207,-1.686504742442198,-0.9028149492200698,1.317633697823867,1.100189744544784,1.203767839386912,-1.431270776889989,1.382910860570339,0.003125940412181876,-0.07788682438757535,0.4414282259284606,0.1289228962236909,-0.8302142603636163,-0.5035929097116129,-1.19364118200992,-0.7517233228909227,1.455841403008231,-0.8286035327893002,0.2897744603757754,-0.4800534842711301,-0.6048293542152092,1.460110180396234,0.1496793540957,-1.433321100298199,-0.01030331862859197,-0.2122360348379401,-0.9063401785642264,-2.102152478895267,1.893360463671002,-0.9681258370240697,-0.1026030363768813,0.2399595721218171,0.06089889324995736,-2.177576028275485,-0.117860143249397,0.1122947874062589,0.007886197667537481,1.877743871542488,2.158756553649643,0.7097145222400491,0.7669833787543111,-0.3082114208255147,1.012001848561405,-0.9190515969353139,0.5633800772498873,0.3224827493152965,0.3666743632573016,1.129835153417458,-0.9414980759314387,0.2178376429447302,1.415412293051703,-0.3837330479260749,-0.1740863735877855,-0.2217445171338238,-1.009528722482581,0.4807252662688465,1.604407328261084,-1.515024528820714,-1.416023914493506,0.8767773265560754,0.6241324126213942,2.112277287816144,-0.3561244157226174,-1.064464208651573,1.077116538453967,1.181575566544048,0.198392094643414,-0.4004052494081449,0.6161542807326543,1.974156747983414,1.884662324235259,-1.588620546593662,-0.5399231641104368,-1.16946146365045,0.5591059885745473,-1.819347246617953,0.3933439723958107,0.04213410586766129,1.179664176947687,-0.2569211761841879,-1.056336097801672,0.1987772051264224],10,null,\"circles\",{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":[\"#FDD6A2\",\"#FEE5C2\",\"#F16D4B\",\"#FED9A8\",\"#B30000\",\"#FDA06A\",\"#FDC992\",\"#FDAA73\",\"#FDD09A\",\"#FC8C59\",\"#FDA872\",\"#F16B4A\",\"#FDBC85\",\"#FC8E5A\",\"#FFEDD3\",\"#FDB780\",\"#E54F36\",\"#FDC089\",\"#FEECD2\",\"#FDAD76\",\"#FFEFD9\",\"#E7543A\",\"#FFF4E5\",\"#FDA771\",\"#FDBC85\",\"#800000\",\"#FFF5E7\",\"#FEDAAA\",\"#FFF2E0\",\"#EE6246\",\"#FDC891\",\"#808080\",\"#FEE2BB\",\"#F98455\",\"#FDA46E\",\"#FC905C\",\"#E0442D\",\"#7F0000\",\"#FEDDB1\",\"#FDD19B\",\"#FDC28B\",\"#FDBA83\",\"#FDAB75\",\"#F67C51\",\"#FDBF88\",\"#FDAB74\",\"#F06849\",\"#FDD49E\",\"#FDBD86\",\"#FA8756\",\"#FDA06A\",\"#FDD8A7\",\"#FC8D59\",\"#FDCA93\",\"#FDAE77\",\"#808080\",\"#FED9AA\",\"#FEE6C3\",\"#FFF0DC\",\"#FDBC85\",\"#F26E4C\",\"#FDAF79\",\"#FDD8A7\",\"#FEE2BC\",\"#FEDCB0\",\"#FDC38C\",\"#C82112\",\"#FDCE97\",\"#FDD5A1\",\"#FEE4C1\",\"#FEE0B8\",\"#FDA771\",\"#EB5C40\",\"#FEDBAC\",\"#FEE6C3\",\"#C61E11\",\"#FDAB74\",\"#FD9E68\",\"#FDB17A\",\"#FEE6C4\",\"#F88053\",\"#FDC08A\",\"#FDA670\",\"#FDB57F\",\"#DF442D\",\"#FDAC76\",\"#FDD49E\",\"#E8563B\",\"#FEDDB1\",\"#F4734E\",\"#FFF1DD\",\"#FD9863\",\"#FEDAAB\",\"#FEDDB2\",\"#FDA56F\",\"#E55036\",\"#FEDDB0\",\"#808080\",\"#FDCF98\",\"#FDC48D\",\"#EB5C40\",\"#FEE6C3\",\"#FD9560\",\"#FDC58E\",\"#A60001\",\"#FEDAAB\",\"#FDCF99\",\"#F3734D\",\"#FEE3BE\",\"#808080\",\"#FDBC85\",\"#FDBE87\",\"#FEE1BA\",\"#F98355\",\"#FDBD86\",\"#FEDDB0\",\"#FDA46E\",\"#FEE2BB\",\"#FDD09A\",\"#F88154\",\"#FDA771\",\"#FDC48E\",\"#E34C33\",\"#FDD39D\",\"#FDC58E\",\"#FDAE77\",\"#808080\",\"#FDC18A\",\"#EA5A3E\",\"#808080\",\"#F67B51\",\"#FEE9CB\",\"#808080\",\"#FB8957\",\"#FDC790\",\"#E65339\",\"#FFF7EC\",\"#FEE5C1\",\"#FDAA74\",\"#FDD49F\",\"#E9583C\",\"#FDCC95\",\"#FB8957\",\"#FDD5A0\",\"#F06849\",\"#FDD49F\",\"#FDB780\",\"#FEEACD\",\"#FDBD86\",\"#FDD5A0\",\"#FEDEB3\",\"#FDB881\",\"#FD9A64\",\"#DB3B26\",\"#FD9560\",\"#FDC18A\",\"#FED8A7\",\"#FDB67F\",\"#FEE1BA\",\"#CA2415\",\"#FDC58F\",\"#FDB27C\",\"#F67A51\",\"#F88153\",\"#FC935F\",\"#EC5E42\",\"#FEE2BB\",\"#C31A0E\",\"#E7553B\",\"#DD3E28\",\"#FDC28B\",\"#FEE6C4\",\"#FDCE98\",\"#FD9B65\",\"#F67A51\",\"#FFEDD4\",\"#FDC18A\",\"#FDBE87\",\"#FDB67F\",\"#FD9E69\",\"#FDD49F\",\"#FD9C67\",\"#FFEDD5\",\"#FEECD1\",\"#BE1409\",\"#FFF6E9\",\"#FDB57E\",\"#FDCD97\",\"#E1472F\",\"#AE0000\",\"#FA8857\",\"#C21A0D\",\"#FDD6A2\",\"#FDB079\",\"#FEE1BA\",\"#FDD09A\",\"#FDC690\",\"#FEE9C9\",\"#F3724D\",\"#FDAA74\",\"#FDD6A2\",\"#FFF1DD\",\"#FEE3BE\",\"#FEE2BB\",\"#FDC18B\",\"#FDA973\",\"#FEECD0\",\"#B30000\",\"#FDC08A\",\"#FA8656\",\"#FEDBAC\",\"#FDA36D\",\"#FDD09A\",\"#FD945F\",\"#FEE6C4\",\"#FDCC96\",\"#FDC791\",\"#FDCF99\",\"#FDBF88\",\"#EF6649\",\"#F06749\",\"#FDB27B\",\"#F88254\",\"#FDAE77\",\"#FDA46E\",\"#FD9964\",\"#FEE8C7\",\"#FEDFB6\",\"#FDD8A6\",\"#FEDBAC\",\"#FDC18A\",\"#FDC58F\",\"#E9583D\",\"#FDD59F\",\"#FDA06A\",\"#FDC089\",\"#FFEDD4\",\"#FEE1B9\",\"#F98354\",\"#FC925E\",\"#FEE0B7\",\"#FDA46E\",\"#FA8656\",\"#FDA46E\",\"#B70903\",\"#DD4029\",\"#F06749\",\"#FDBE87\",\"#FEE3BD\",\"#FEEACC\",\"#FDD49E\",\"#CC2516\",\"#FDD5A0\",\"#FEDEB2\",\"#FDD5A1\",\"#F4744E\",\"#B60502\",\"#FDC18A\",\"#FDD8A6\",\"#FEE2BB\",\"#FDC18A\",\"#FDCF99\",\"#808080\",\"#FEEBCF\",\"#FEE5C1\",\"#808080\",\"#FDBD86\",\"#808080\",\"#FDA770\",\"#FEDEB3\",\"#FD9A65\",\"#FEEACC\",\"#FDC993\",\"#FED9A8\",\"#F88154\",\"#FD9B66\",\"#FD9B66\",\"#FDD19A\",\"#FDCC95\",\"#B20000\",\"#FEE8C9\",\"#FDBB84\",\"#FDC08A\",\"#E0452D\",\"#FEE3BD\",\"#FDBF88\",\"#FDC28B\",\"#EF6649\",\"#EF6548\",\"#FC915D\",\"#FDB07A\",\"#BE1509\",\"#FC935E\",\"#F5774F\",\"#FDC992\",\"#FFF4E4\",\"#F87F53\",\"#FDD09A\",\"#FDBA83\",\"#FDA56F\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#FDD6A2\",\"#FEE5C2\",\"#F16D4B\",\"#FED9A8\",\"#B30000\",\"#FDA06A\",\"#FDC992\",\"#FDAA73\",\"#FDD09A\",\"#FC8C59\",\"#FDA872\",\"#F16B4A\",\"#FDBC85\",\"#FC8E5A\",\"#FFEDD3\",\"#FDB780\",\"#E54F36\",\"#FDC089\",\"#FEECD2\",\"#FDAD76\",\"#FFEFD9\",\"#E7543A\",\"#FFF4E5\",\"#FDA771\",\"#FDBC85\",\"#800000\",\"#FFF5E7\",\"#FEDAAA\",\"#FFF2E0\",\"#EE6246\",\"#FDC891\",\"#808080\",\"#FEE2BB\",\"#F98455\",\"#FDA46E\",\"#FC905C\",\"#E0442D\",\"#7F0000\",\"#FEDDB1\",\"#FDD19B\",\"#FDC28B\",\"#FDBA83\",\"#FDAB75\",\"#F67C51\",\"#FDBF88\",\"#FDAB74\",\"#F06849\",\"#FDD49E\",\"#FDBD86\",\"#FA8756\",\"#FDA06A\",\"#FDD8A7\",\"#FC8D59\",\"#FDCA93\",\"#FDAE77\",\"#808080\",\"#FED9AA\",\"#FEE6C3\",\"#FFF0DC\",\"#FDBC85\",\"#F26E4C\",\"#FDAF79\",\"#FDD8A7\",\"#FEE2BC\",\"#FEDCB0\",\"#FDC38C\",\"#C82112\",\"#FDCE97\",\"#FDD5A1\",\"#FEE4C1\",\"#FEE0B8\",\"#FDA771\",\"#EB5C40\",\"#FEDBAC\",\"#FEE6C3\",\"#C61E11\",\"#FDAB74\",\"#FD9E68\",\"#FDB17A\",\"#FEE6C4\",\"#F88053\",\"#FDC08A\",\"#FDA670\",\"#FDB57F\",\"#DF442D\",\"#FDAC76\",\"#FDD49E\",\"#E8563B\",\"#FEDDB1\",\"#F4734E\",\"#FFF1DD\",\"#FD9863\",\"#FEDAAB\",\"#FEDDB2\",\"#FDA56F\",\"#E55036\",\"#FEDDB0\",\"#808080\",\"#FDCF98\",\"#FDC48D\",\"#EB5C40\",\"#FEE6C3\",\"#FD9560\",\"#FDC58E\",\"#A60001\",\"#FEDAAB\",\"#FDCF99\",\"#F3734D\",\"#FEE3BE\",\"#808080\",\"#FDBC85\",\"#FDBE87\",\"#FEE1BA\",\"#F98355\",\"#FDBD86\",\"#FEDDB0\",\"#FDA46E\",\"#FEE2BB\",\"#FDD09A\",\"#F88154\",\"#FDA771\",\"#FDC48E\",\"#E34C33\",\"#FDD39D\",\"#FDC58E\",\"#FDAE77\",\"#808080\",\"#FDC18A\",\"#EA5A3E\",\"#808080\",\"#F67B51\",\"#FEE9CB\",\"#808080\",\"#FB8957\",\"#FDC790\",\"#E65339\",\"#FFF7EC\",\"#FEE5C1\",\"#FDAA74\",\"#FDD49F\",\"#E9583C\",\"#FDCC95\",\"#FB8957\",\"#FDD5A0\",\"#F06849\",\"#FDD49F\",\"#FDB780\",\"#FEEACD\",\"#FDBD86\",\"#FDD5A0\",\"#FEDEB3\",\"#FDB881\",\"#FD9A64\",\"#DB3B26\",\"#FD9560\",\"#FDC18A\",\"#FED8A7\",\"#FDB67F\",\"#FEE1BA\",\"#CA2415\",\"#FDC58F\",\"#FDB27C\",\"#F67A51\",\"#F88153\",\"#FC935F\",\"#EC5E42\",\"#FEE2BB\",\"#C31A0E\",\"#E7553B\",\"#DD3E28\",\"#FDC28B\",\"#FEE6C4\",\"#FDCE98\",\"#FD9B65\",\"#F67A51\",\"#FFEDD4\",\"#FDC18A\",\"#FDBE87\",\"#FDB67F\",\"#FD9E69\",\"#FDD49F\",\"#FD9C67\",\"#FFEDD5\",\"#FEECD1\",\"#BE1409\",\"#FFF6E9\",\"#FDB57E\",\"#FDCD97\",\"#E1472F\",\"#AE0000\",\"#FA8857\",\"#C21A0D\",\"#FDD6A2\",\"#FDB079\",\"#FEE1BA\",\"#FDD09A\",\"#FDC690\",\"#FEE9C9\",\"#F3724D\",\"#FDAA74\",\"#FDD6A2\",\"#FFF1DD\",\"#FEE3BE\",\"#FEE2BB\",\"#FDC18B\",\"#FDA973\",\"#FEECD0\",\"#B30000\",\"#FDC08A\",\"#FA8656\",\"#FEDBAC\",\"#FDA36D\",\"#FDD09A\",\"#FD945F\",\"#FEE6C4\",\"#FDCC96\",\"#FDC791\",\"#FDCF99\",\"#FDBF88\",\"#EF6649\",\"#F06749\",\"#FDB27B\",\"#F88254\",\"#FDAE77\",\"#FDA46E\",\"#FD9964\",\"#FEE8C7\",\"#FEDFB6\",\"#FDD8A6\",\"#FEDBAC\",\"#FDC18A\",\"#FDC58F\",\"#E9583D\",\"#FDD59F\",\"#FDA06A\",\"#FDC089\",\"#FFEDD4\",\"#FEE1B9\",\"#F98354\",\"#FC925E\",\"#FEE0B7\",\"#FDA46E\",\"#FA8656\",\"#FDA46E\",\"#B70903\",\"#DD4029\",\"#F06749\",\"#FDBE87\",\"#FEE3BD\",\"#FEEACC\",\"#FDD49E\",\"#CC2516\",\"#FDD5A0\",\"#FEDEB2\",\"#FDD5A1\",\"#F4744E\",\"#B60502\",\"#FDC18A\",\"#FDD8A6\",\"#FEE2BB\",\"#FDC18A\",\"#FDCF99\",\"#808080\",\"#FEEBCF\",\"#FEE5C1\",\"#808080\",\"#FDBD86\",\"#808080\",\"#FDA770\",\"#FEDEB3\",\"#FD9A65\",\"#FEEACC\",\"#FDC993\",\"#FED9A8\",\"#F88154\",\"#FD9B66\",\"#FD9B66\",\"#FDD19A\",\"#FDCC95\",\"#B20000\",\"#FEE8C9\",\"#FDBB84\",\"#FDC08A\",\"#E0452D\",\"#FEE3BD\",\"#FDBF88\",\"#FDC28B\",\"#EF6649\",\"#EF6548\",\"#FC915D\",\"#FDB07A\",\"#BE1509\",\"#FC935E\",\"#F5774F\",\"#FDC992\",\"#FFF4E4\",\"#F87F53\",\"#FDD09A\",\"#FDBA83\",\"#FDA56F\"],\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"addLegend\",\"args\":[{\"colors\":[\"#FFF7EC , #FEE5C2 14.3851543342441%, #FDCA94 29.9759285027722%, #FD9E68 45.5667026713002%, #F06A4A 61.1574768398283%, #D22B1B 76.7482510083563%, #9E0001 92.3390251768844%, #7F0000 \"],\"labels\":[\"0.5\",\"1.0\",\"1.5\",\"2.0\",\"2.5\",\"3.0\"],\"na_color\":\"#808080\",\"na_label\":\"NA\",\"opacity\":0.5,\"position\":\"bottomleft\",\"type\":\"numeric\",\"title\":\"z\",\"extra\":{\"p_1\":0.143851543342441,\"p_n\":0.9233902517688439},\"layerId\":null,\"className\":\"info legend\",\"group\":\"circles\"}]},{\"method\":\"addLayersControl\",\"args\":[[],\"circles\",{\"collapsed\":true,\"autoZIndex\":true,\"position\":\"topright\"}]}],\"limits\":{\"lat\":[-2.938977561072442,2.654898332699442],\"lng\":[-2.612334332884302,2.755417575336856]}},\"evals\":[],\"jsHooks\":[]} # format legend labels df <- data.frame(x = rnorm(100), y = rexp(100, 2), z = runif(100)) pal <- colorBin(\"PuOr\", df$z, bins = c(0, .1, .4, .9, 1)) leaflet(df) %>% addTiles() %>% addCircleMarkers(~x, ~y, color = ~pal(z), group = \"circles\") %>% addLegend(pal = pal, values = ~z, group = \"circles\", position = \"bottomleft\") %>% addLayersControl(overlayGroups = c(\"circles\")) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[0.2692867037840188,0.212140791118145,1.046658438567388,0.3771682899839398,0.7106290954412665,0.1942461444996297,0.8639515353814833,0.2232086854055524,0.355275936546519,0.0486942364233251,0.6987547361803176,0.3356562776025385,0.442932598271823,0.6092310901521207,0.8127087093011401,0.05220129252725467,0.1518081404274,0.4055381689620911,0.8355899462056281,0.16139040957205,0.5355923452525414,0.02548254048451781,0.118936445331201,0.9089908264157297,0.2677212303970009,0.3162949671968818,0.9714767001149179,0.7793851283228252,0.6610611132136048,0.0616738076787442,0.2505097503308207,0.05119776749052107,0.3682794489907571,0.08018261892721057,0.6179253337694766,0.8732052031709832,0.329900240059942,0.2236487014266211,0.283117612125352,1.510493000083978,0.2230917664710432,0.1964026989880949,0.1229662053393779,0.3072527183685452,0.5521513232751252,0.2531260862015188,0.0763318418700733,1.481209669178152,0.1980540752410889,0.7924832375300052,0.04243761277757585,0.2967723628971726,0.2196246690582484,0.2281896565109491,1.65135294190588,0.6218465812105742,1.02935343138398,0.865973314228368,0.05256699976437223,0.6321182833876893,0.4373919181315661,0.7279335062432883,0.5070243114395501,0.9635419882413866,0.3843208630359233,0.02575771917139133,0.1853092038072646,0.1008155907038599,0.2061404753476381,0.3503817180015383,0.1218532985076308,0.1127746735468033,0.02791473780559238,0.456631548216051,0.2363630407489836,0.1262117471246489,0.2223208614583135,0.2954503307119012,0.1924614944362566,0.1079764253084629,0.05515212402679026,0.1173610113607709,0.2696835622191429,0.4492581952153207,0.1296409552451223,0.3024997254833579,0.04223556397482753,0.1309975676704198,0.9523026616823794,1.006957940715266,0.04539070327624838,1.591538189183535,0.01239299867302179,0.4387108953459621,0.1397780675906688,0.2458650845141725,0.005621975288390082,0.7774760597641138,0.01505035441368818,0.01405656595920493],[-0.3984334782151365,-0.6007732862438636,-0.2098360075316202,0.4855063597277793,1.428969096463668,-0.4799556879769412,1.295198373718015,0.1650741495529123,0.3254972433419994,-0.5667226199339622,-1.050572186377197,-0.9463067128475058,-0.07517995897755188,0.1879264971469662,1.249107639432808,-0.5487269009214932,-1.710331134449975,-0.7009859775934013,1.89782704307245,1.114268604967617,0.8469617515788301,0.3908726017543429,1.053655337491501,-0.5554842557687424,-0.6294126759023519,0.303364542094377,-0.03803220194126955,1.76272950235461,0.6146292893964426,-1.660586791892282,-1.048458093797681,-0.9293644974648377,1.541006628726101,0.1792863811621108,-1.344940376000263,-0.7489042769106593,-0.9894249452328882,-0.8479671835686403,-0.9102960395242335,0.4099617962566627,-2.820052041034497,0.3252107784999188,-0.8232665308569107,-0.09100569714754379,0.4940551581799212,1.041615594565685,0.09354926547536348,-0.5219444445390135,-0.5099417583845377,0.5782052207077775,-2.067161490114969,0.5308857761276942,-1.797446708323689,-0.324496483339947,-0.0202597104750414,0.4964312305581562,-0.3164416135452041,1.668848910482331,-0.1430423975180836,1.595746692557468,-0.1114377754631172,-1.084000074326908,-0.2386753429291021,-1.95882983800578,0.6190932730090485,0.3341261167269697,-1.04205906405728,1.039254510609248,-0.6656110074318481,0.8034733706349627,-1.517319718023491,-0.8383098544417419,0.3955461782178744,0.2445431280573691,2.617296949103566,-0.737876447294739,0.5842284108273538,-1.23887255805986,-0.8900996817323477,-1.510025371518169,-0.5851823983797985,-1.553675841820956,-0.5760951492856244,1.226974959089384,0.4612446431625483,-1.074960989560614,-0.2496090257594738,-0.4884538935375984,0.4662626992638065,0.2233549008401526,-0.5657644940993514,0.1276178485048165,0.3680300362657145,0.6089351089176784,0.9146069464284257,0.495767250160165,0.3770415841379589,-1.14818247054384,0.9416994572493231,0.9987979591905438],10,null,\"circles\",{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":[\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#E66101\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#5E3C99\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#E66101\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#E66101\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#E66101\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#5E3C99\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#E66101\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#E66101\"],\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"addLegend\",\"args\":[{\"colors\":[\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\"],\"labels\":[\"0.0 – 0.1\",\"0.1 – 0.4\",\"0.4 – 0.9\",\"0.9 – 1.0\"],\"na_color\":null,\"na_label\":\"NA\",\"opacity\":0.5,\"position\":\"bottomleft\",\"type\":\"bin\",\"title\":\"z\",\"extra\":null,\"layerId\":null,\"className\":\"info legend\",\"group\":\"circles\"}]},{\"method\":\"addLayersControl\",\"args\":[[],\"circles\",{\"collapsed\":true,\"autoZIndex\":true,\"position\":\"topright\"}]}],\"limits\":{\"lat\":[0.005621975288390082,1.65135294190588],\"lng\":[-2.820052041034497,2.617296949103566]}},\"evals\":[],\"jsHooks\":[]} leaflet(df) %>% addTiles() %>% addCircleMarkers(~x, ~y, color = ~pal(z), group = \"circles\") %>% addLegend(pal = pal, values = ~z, labFormat = labelFormat( prefix = \"(\", suffix = \")%\", between = \", \", transform = function(x) 100 * x ), group = \"circles\", position = \"bottomleft\" ) %>% addLayersControl(overlayGroups = c(\"circles\")) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[0.2692867037840188,0.212140791118145,1.046658438567388,0.3771682899839398,0.7106290954412665,0.1942461444996297,0.8639515353814833,0.2232086854055524,0.355275936546519,0.0486942364233251,0.6987547361803176,0.3356562776025385,0.442932598271823,0.6092310901521207,0.8127087093011401,0.05220129252725467,0.1518081404274,0.4055381689620911,0.8355899462056281,0.16139040957205,0.5355923452525414,0.02548254048451781,0.118936445331201,0.9089908264157297,0.2677212303970009,0.3162949671968818,0.9714767001149179,0.7793851283228252,0.6610611132136048,0.0616738076787442,0.2505097503308207,0.05119776749052107,0.3682794489907571,0.08018261892721057,0.6179253337694766,0.8732052031709832,0.329900240059942,0.2236487014266211,0.283117612125352,1.510493000083978,0.2230917664710432,0.1964026989880949,0.1229662053393779,0.3072527183685452,0.5521513232751252,0.2531260862015188,0.0763318418700733,1.481209669178152,0.1980540752410889,0.7924832375300052,0.04243761277757585,0.2967723628971726,0.2196246690582484,0.2281896565109491,1.65135294190588,0.6218465812105742,1.02935343138398,0.865973314228368,0.05256699976437223,0.6321182833876893,0.4373919181315661,0.7279335062432883,0.5070243114395501,0.9635419882413866,0.3843208630359233,0.02575771917139133,0.1853092038072646,0.1008155907038599,0.2061404753476381,0.3503817180015383,0.1218532985076308,0.1127746735468033,0.02791473780559238,0.456631548216051,0.2363630407489836,0.1262117471246489,0.2223208614583135,0.2954503307119012,0.1924614944362566,0.1079764253084629,0.05515212402679026,0.1173610113607709,0.2696835622191429,0.4492581952153207,0.1296409552451223,0.3024997254833579,0.04223556397482753,0.1309975676704198,0.9523026616823794,1.006957940715266,0.04539070327624838,1.591538189183535,0.01239299867302179,0.4387108953459621,0.1397780675906688,0.2458650845141725,0.005621975288390082,0.7774760597641138,0.01505035441368818,0.01405656595920493],[-0.3984334782151365,-0.6007732862438636,-0.2098360075316202,0.4855063597277793,1.428969096463668,-0.4799556879769412,1.295198373718015,0.1650741495529123,0.3254972433419994,-0.5667226199339622,-1.050572186377197,-0.9463067128475058,-0.07517995897755188,0.1879264971469662,1.249107639432808,-0.5487269009214932,-1.710331134449975,-0.7009859775934013,1.89782704307245,1.114268604967617,0.8469617515788301,0.3908726017543429,1.053655337491501,-0.5554842557687424,-0.6294126759023519,0.303364542094377,-0.03803220194126955,1.76272950235461,0.6146292893964426,-1.660586791892282,-1.048458093797681,-0.9293644974648377,1.541006628726101,0.1792863811621108,-1.344940376000263,-0.7489042769106593,-0.9894249452328882,-0.8479671835686403,-0.9102960395242335,0.4099617962566627,-2.820052041034497,0.3252107784999188,-0.8232665308569107,-0.09100569714754379,0.4940551581799212,1.041615594565685,0.09354926547536348,-0.5219444445390135,-0.5099417583845377,0.5782052207077775,-2.067161490114969,0.5308857761276942,-1.797446708323689,-0.324496483339947,-0.0202597104750414,0.4964312305581562,-0.3164416135452041,1.668848910482331,-0.1430423975180836,1.595746692557468,-0.1114377754631172,-1.084000074326908,-0.2386753429291021,-1.95882983800578,0.6190932730090485,0.3341261167269697,-1.04205906405728,1.039254510609248,-0.6656110074318481,0.8034733706349627,-1.517319718023491,-0.8383098544417419,0.3955461782178744,0.2445431280573691,2.617296949103566,-0.737876447294739,0.5842284108273538,-1.23887255805986,-0.8900996817323477,-1.510025371518169,-0.5851823983797985,-1.553675841820956,-0.5760951492856244,1.226974959089384,0.4612446431625483,-1.074960989560614,-0.2496090257594738,-0.4884538935375984,0.4662626992638065,0.2233549008401526,-0.5657644940993514,0.1276178485048165,0.3680300362657145,0.6089351089176784,0.9146069464284257,0.495767250160165,0.3770415841379589,-1.14818247054384,0.9416994572493231,0.9987979591905438],10,null,\"circles\",{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":[\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#E66101\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#5E3C99\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#E66101\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#E66101\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#E66101\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#5E3C99\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#E66101\",\"#E66101\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#5E3C99\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#B2ABD2\",\"#5E3C99\",\"#FDB863\",\"#FDB863\",\"#E66101\",\"#B2ABD2\",\"#FDB863\",\"#E66101\",\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#B2ABD2\",\"#FDB863\",\"#E66101\"],\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"addLegend\",\"args\":[{\"colors\":[\"#E66101\",\"#FDB863\",\"#B2ABD2\",\"#5E3C99\"],\"labels\":[\"(0, 10)%\",\"(10, 40)%\",\"(40, 90)%\",\"(90, 100)%\"],\"na_color\":null,\"na_label\":\"NA\",\"opacity\":0.5,\"position\":\"bottomleft\",\"type\":\"bin\",\"title\":\"z\",\"extra\":null,\"layerId\":null,\"className\":\"info legend\",\"group\":\"circles\"}]},{\"method\":\"addLayersControl\",\"args\":[[],\"circles\",{\"collapsed\":true,\"autoZIndex\":true,\"position\":\"topright\"}]}],\"limits\":{\"lat\":[0.005621975288390082,1.65135294190588],\"lng\":[-2.820052041034497,2.617296949103566]}},\"evals\":[],\"jsHooks\":[]}# }"},{"path":"https://rstudio.github.io/leaflet/reference/addMapPane.html","id":null,"dir":"Reference","previous_headings":"","what":"Add additional panes to leaflet map to control layer order — addMapPane","title":"Add additional panes to leaflet map to control layer order — addMapPane","text":"map panes can created supplying name zIndex control layer ordering. recommend zIndex value 400 (default overlay pane) 500 (default shadow pane). can use pane render overlays (points, lines, polygons) setting pane argument leafletOptions(). give control order layers, e.g., points always top polygons. two layers provided pane, overlay determined order adding. See examples . See https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#map-pane details. error \"read property 'appendChild' undefined\" occurs, make sure pane used used display already added map.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMapPane.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add additional panes to leaflet map to control layer order — addMapPane","text":"","code":"addMapPane(map, name, zIndex)"},{"path":"https://rstudio.github.io/leaflet/reference/addMapPane.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add additional panes to leaflet map to control layer order — addMapPane","text":"map leaflet mapview object. name name new pane (refer leafletOptions(). zIndex zIndex pane. Panes higher index rendered panes lower indices.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMapPane.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add additional panes to leaflet map to control layer order — addMapPane","text":"","code":"rand_lng <- function(n = 10) rnorm(n, -93.65, .01) rand_lat <- function(n = 10) rnorm(n, 42.0285, .01) random_data <- data.frame( lng = rand_lng(50), lat = rand_lat(50), radius = runif(50, 50, 150), circleId = paste0(\"circle #\", 1:50), lineId = paste0(\"circle #\", 1:50) ) # display circles (zIndex: 420) above the lines (zIndex: 410), even when added first leaflet() %>% addTiles() %>% # move the center to Snedecor Hall setView(-93.65, 42.0285, zoom = 14) %>% addMapPane(\"ames_lines\", zIndex = 410) %>% # shown below ames_circles addMapPane(\"ames_circles\", zIndex = 420) %>% # shown above ames_lines # points above polygons addCircles( data = random_data, ~lng, ~lat, radius = ~radius, popup = ~circleId, options = pathOptions(pane = \"ames_circles\") ) %>% # lines in 'ames_lines' pane addPolylines( data = random_data, ~lng, ~lat, color = \"#F00\", weight = 20, options = pathOptions(pane = \"ames_lines\") ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"createMapPane\",\"args\":[\"ames_lines\",410]},{\"method\":\"createMapPane\",\"args\":[\"ames_circles\",420]},{\"method\":\"addCircles\",\"args\":[[42.02192942589536,42.02368217749863,42.02867757878648,42.0199046424421,42.04207704976999,42.04065061176793,42.04303912917111,42.02764088018438,42.0223243124986,42.0263173975076,42.01523994788681,42.00487791103354,42.01440030446491,42.03104397135973,42.03145870299451,42.02906789793922,42.02747345143391,42.0480192303197,42.03728565956003,42.01543383072165,42.02940344271749,42.03752358039835,42.03399421324455,42.01980160799815,42.0281078535213,42.02331548317503,42.01938150382963,42.03000313640027,42.03290355448512,42.04169782058712,42.03096561126368,42.03791826599055,42.02507848668304,42.02573853189486,42.03233656779902,42.04296910224745,42.0458390029055,42.03306429375908,42.03557503489859,42.04913789223756,42.02873910586354,42.03095949460654,42.03122059144599,42.0185754142301,42.028224220487,42.05072845163442,42.03005503899382,42.01980883681512,42.01675510550265,42.01090322692944],[-93.6591592053706,-93.64926732536468,-93.63761828681986,-93.64281628663736,-93.64460533504963,-93.66061233994861,-93.65540737865916,-93.65715204714398,-93.65178920085494,-93.648350297232,-93.65727408166417,-93.6553783712891,-93.65599664903726,-93.63817912245925,-93.64810787124613,-93.6475105088615,-93.63953356588844,-93.66289300936155,-93.64624884429701,-93.65556918390979,-93.64697573369997,-93.64777733534012,-93.65962166963084,-93.64947967630992,-93.64099959618093,-93.65394900880048,-93.64045854004274,-93.65588214347524,-93.6647658452661,-93.66377775769931,-93.66345672313354,-93.65736637962176,-93.65470111495641,-93.63619390662468,-93.63324989071721,-93.63823093366396,-93.65148898335575,-93.65177823364408,-93.6419687814204,-93.65415795348841,-93.63787510414093,-93.63759639967583,-93.64314324119998,-93.65026798678019,-93.64690419491062,-93.64750135671832,-93.66356460868913,-93.64400620232379,-93.64991352209502,-93.6490928338968],[102.3269695229828,89.31053976994008,137.7893300261348,78.82499238476157,113.2178187603131,81.3025128794834,64.58227424882352,132.0500965928659,124.5619802735746,117.7873467095196,70.51377177704126,149.1973087890074,116.8956527952105,125.3881895681843,114.5198054146022,60.51661607343704,54.98048129957169,105.0795055227354,52.72053678054363,68.72580656781793,114.8336424026638,132.4718985240906,141.554355667904,132.5556990224868,129.5555043732747,118.8114724587649,83.86629270389676,96.83029074221849,133.6986915674061,127.0487755769864,109.5679931808263,109.6528243506327,67.41410011891276,97.56676240358502,143.3948250720277,55.95374803524464,64.32454616297036,92.67803230322897,106.4453589962795,68.72994224540889,110.2749522775412,123.487829323858,56.83488131035119,128.2917964272201,142.1492709312588,54.42821667529643,121.3114854646847,140.3886020416394,123.9581503905356,67.21756304614246],null,null,{\"interactive\":true,\"className\":\"\",\"pane\":\"ames_circles\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2},[\"circle #1\",\"circle #2\",\"circle #3\",\"circle #4\",\"circle #5\",\"circle #6\",\"circle #7\",\"circle #8\",\"circle #9\",\"circle #10\",\"circle #11\",\"circle #12\",\"circle #13\",\"circle #14\",\"circle #15\",\"circle #16\",\"circle #17\",\"circle #18\",\"circle #19\",\"circle #20\",\"circle #21\",\"circle #22\",\"circle #23\",\"circle #24\",\"circle #25\",\"circle #26\",\"circle #27\",\"circle #28\",\"circle #29\",\"circle #30\",\"circle #31\",\"circle #32\",\"circle #33\",\"circle #34\",\"circle #35\",\"circle #36\",\"circle #37\",\"circle #38\",\"circle #39\",\"circle #40\",\"circle #41\",\"circle #42\",\"circle #43\",\"circle #44\",\"circle #45\",\"circle #46\",\"circle #47\",\"circle #48\",\"circle #49\",\"circle #50\"],null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null,null]},{\"method\":\"addPolylines\",\"args\":[[[[{\"lng\":[-93.6591592053706,-93.64926732536468,-93.63761828681986,-93.64281628663736,-93.64460533504963,-93.66061233994861,-93.65540737865916,-93.65715204714398,-93.65178920085494,-93.648350297232,-93.65727408166417,-93.6553783712891,-93.65599664903726,-93.63817912245925,-93.64810787124613,-93.6475105088615,-93.63953356588844,-93.66289300936155,-93.64624884429701,-93.65556918390979,-93.64697573369997,-93.64777733534012,-93.65962166963084,-93.64947967630992,-93.64099959618093,-93.65394900880048,-93.64045854004274,-93.65588214347524,-93.6647658452661,-93.66377775769931,-93.66345672313354,-93.65736637962176,-93.65470111495641,-93.63619390662468,-93.63324989071721,-93.63823093366396,-93.65148898335575,-93.65177823364408,-93.6419687814204,-93.65415795348841,-93.63787510414093,-93.63759639967583,-93.64314324119998,-93.65026798678019,-93.64690419491062,-93.64750135671832,-93.66356460868913,-93.64400620232379,-93.64991352209502,-93.6490928338968],\"lat\":[42.02192942589536,42.02368217749863,42.02867757878648,42.0199046424421,42.04207704976999,42.04065061176793,42.04303912917111,42.02764088018438,42.0223243124986,42.0263173975076,42.01523994788681,42.00487791103354,42.01440030446491,42.03104397135973,42.03145870299451,42.02906789793922,42.02747345143391,42.0480192303197,42.03728565956003,42.01543383072165,42.02940344271749,42.03752358039835,42.03399421324455,42.01980160799815,42.0281078535213,42.02331548317503,42.01938150382963,42.03000313640027,42.03290355448512,42.04169782058712,42.03096561126368,42.03791826599055,42.02507848668304,42.02573853189486,42.03233656779902,42.04296910224745,42.0458390029055,42.03306429375908,42.03557503489859,42.04913789223756,42.02873910586354,42.03095949460654,42.03122059144599,42.0185754142301,42.028224220487,42.05072845163442,42.03005503899382,42.01980883681512,42.01675510550265,42.01090322692944]}]]],null,null,{\"interactive\":true,\"className\":\"\",\"pane\":\"ames_lines\",\"stroke\":true,\"color\":\"#F00\",\"weight\":20,\"opacity\":0.5,\"fill\":false,\"fillColor\":\"#F00\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"setView\":[[42.0285,-93.65000000000001],14,[]],\"limits\":{\"lat\":[42.00487791103354,42.05072845163442],\"lng\":[-93.6647658452661,-93.63324989071721]}},\"evals\":[],\"jsHooks\":[]} # same example but circles (zIndex: 420) are below the lines (zIndex: 430) leaflet() %>% addTiles() %>% # move the center to Snedecor Hall setView(-93.65, 42.0285, zoom = 14) %>% addMapPane(\"ames_lines\", zIndex = 430) %>% # shown below ames_circles addMapPane(\"ames_circles\", zIndex = 420) %>% # shown above ames_lines # points above polygons addCircles( data = random_data, ~lng, ~lat, radius = ~radius, popup = ~circleId, options = pathOptions(pane = \"ames_circles\") ) %>% # lines in 'ames_lines' pane addPolylines( data = random_data, ~lng, ~lat, color = \"#F00\", weight = 20, options = pathOptions(pane = \"ames_lines\") ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"createMapPane\",\"args\":[\"ames_lines\",430]},{\"method\":\"createMapPane\",\"args\":[\"ames_circles\",420]},{\"method\":\"addCircles\",\"args\":[[42.02192942589536,42.02368217749863,42.02867757878648,42.0199046424421,42.04207704976999,42.04065061176793,42.04303912917111,42.02764088018438,42.0223243124986,42.0263173975076,42.01523994788681,42.00487791103354,42.01440030446491,42.03104397135973,42.03145870299451,42.02906789793922,42.02747345143391,42.0480192303197,42.03728565956003,42.01543383072165,42.02940344271749,42.03752358039835,42.03399421324455,42.01980160799815,42.0281078535213,42.02331548317503,42.01938150382963,42.03000313640027,42.03290355448512,42.04169782058712,42.03096561126368,42.03791826599055,42.02507848668304,42.02573853189486,42.03233656779902,42.04296910224745,42.0458390029055,42.03306429375908,42.03557503489859,42.04913789223756,42.02873910586354,42.03095949460654,42.03122059144599,42.0185754142301,42.028224220487,42.05072845163442,42.03005503899382,42.01980883681512,42.01675510550265,42.01090322692944],[-93.6591592053706,-93.64926732536468,-93.63761828681986,-93.64281628663736,-93.64460533504963,-93.66061233994861,-93.65540737865916,-93.65715204714398,-93.65178920085494,-93.648350297232,-93.65727408166417,-93.6553783712891,-93.65599664903726,-93.63817912245925,-93.64810787124613,-93.6475105088615,-93.63953356588844,-93.66289300936155,-93.64624884429701,-93.65556918390979,-93.64697573369997,-93.64777733534012,-93.65962166963084,-93.64947967630992,-93.64099959618093,-93.65394900880048,-93.64045854004274,-93.65588214347524,-93.6647658452661,-93.66377775769931,-93.66345672313354,-93.65736637962176,-93.65470111495641,-93.63619390662468,-93.63324989071721,-93.63823093366396,-93.65148898335575,-93.65177823364408,-93.6419687814204,-93.65415795348841,-93.63787510414093,-93.63759639967583,-93.64314324119998,-93.65026798678019,-93.64690419491062,-93.64750135671832,-93.66356460868913,-93.64400620232379,-93.64991352209502,-93.6490928338968],[102.3269695229828,89.31053976994008,137.7893300261348,78.82499238476157,113.2178187603131,81.3025128794834,64.58227424882352,132.0500965928659,124.5619802735746,117.7873467095196,70.51377177704126,149.1973087890074,116.8956527952105,125.3881895681843,114.5198054146022,60.51661607343704,54.98048129957169,105.0795055227354,52.72053678054363,68.72580656781793,114.8336424026638,132.4718985240906,141.554355667904,132.5556990224868,129.5555043732747,118.8114724587649,83.86629270389676,96.83029074221849,133.6986915674061,127.0487755769864,109.5679931808263,109.6528243506327,67.41410011891276,97.56676240358502,143.3948250720277,55.95374803524464,64.32454616297036,92.67803230322897,106.4453589962795,68.72994224540889,110.2749522775412,123.487829323858,56.83488131035119,128.2917964272201,142.1492709312588,54.42821667529643,121.3114854646847,140.3886020416394,123.9581503905356,67.21756304614246],null,null,{\"interactive\":true,\"className\":\"\",\"pane\":\"ames_circles\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2},[\"circle #1\",\"circle #2\",\"circle #3\",\"circle #4\",\"circle #5\",\"circle #6\",\"circle #7\",\"circle #8\",\"circle #9\",\"circle #10\",\"circle #11\",\"circle #12\",\"circle #13\",\"circle #14\",\"circle #15\",\"circle #16\",\"circle #17\",\"circle #18\",\"circle #19\",\"circle #20\",\"circle #21\",\"circle #22\",\"circle #23\",\"circle #24\",\"circle #25\",\"circle #26\",\"circle #27\",\"circle #28\",\"circle #29\",\"circle #30\",\"circle #31\",\"circle #32\",\"circle #33\",\"circle #34\",\"circle #35\",\"circle #36\",\"circle #37\",\"circle #38\",\"circle #39\",\"circle #40\",\"circle #41\",\"circle #42\",\"circle #43\",\"circle #44\",\"circle #45\",\"circle #46\",\"circle #47\",\"circle #48\",\"circle #49\",\"circle #50\"],null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null,null]},{\"method\":\"addPolylines\",\"args\":[[[[{\"lng\":[-93.6591592053706,-93.64926732536468,-93.63761828681986,-93.64281628663736,-93.64460533504963,-93.66061233994861,-93.65540737865916,-93.65715204714398,-93.65178920085494,-93.648350297232,-93.65727408166417,-93.6553783712891,-93.65599664903726,-93.63817912245925,-93.64810787124613,-93.6475105088615,-93.63953356588844,-93.66289300936155,-93.64624884429701,-93.65556918390979,-93.64697573369997,-93.64777733534012,-93.65962166963084,-93.64947967630992,-93.64099959618093,-93.65394900880048,-93.64045854004274,-93.65588214347524,-93.6647658452661,-93.66377775769931,-93.66345672313354,-93.65736637962176,-93.65470111495641,-93.63619390662468,-93.63324989071721,-93.63823093366396,-93.65148898335575,-93.65177823364408,-93.6419687814204,-93.65415795348841,-93.63787510414093,-93.63759639967583,-93.64314324119998,-93.65026798678019,-93.64690419491062,-93.64750135671832,-93.66356460868913,-93.64400620232379,-93.64991352209502,-93.6490928338968],\"lat\":[42.02192942589536,42.02368217749863,42.02867757878648,42.0199046424421,42.04207704976999,42.04065061176793,42.04303912917111,42.02764088018438,42.0223243124986,42.0263173975076,42.01523994788681,42.00487791103354,42.01440030446491,42.03104397135973,42.03145870299451,42.02906789793922,42.02747345143391,42.0480192303197,42.03728565956003,42.01543383072165,42.02940344271749,42.03752358039835,42.03399421324455,42.01980160799815,42.0281078535213,42.02331548317503,42.01938150382963,42.03000313640027,42.03290355448512,42.04169782058712,42.03096561126368,42.03791826599055,42.02507848668304,42.02573853189486,42.03233656779902,42.04296910224745,42.0458390029055,42.03306429375908,42.03557503489859,42.04913789223756,42.02873910586354,42.03095949460654,42.03122059144599,42.0185754142301,42.028224220487,42.05072845163442,42.03005503899382,42.01980883681512,42.01675510550265,42.01090322692944]}]]],null,null,{\"interactive\":true,\"className\":\"\",\"pane\":\"ames_lines\",\"stroke\":true,\"color\":\"#F00\",\"weight\":20,\"opacity\":0.5,\"fill\":false,\"fillColor\":\"#F00\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"setView\":[[42.0285,-93.65000000000001],14,[]],\"limits\":{\"lat\":[42.00487791103354,42.05072845163442],\"lng\":[-93.6647658452661,-93.63324989071721]}},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addMeasure.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a measure control to the map. — addMeasure","title":"Add a measure control to the map. — addMeasure","text":"Add measure control map.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMeasure.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a measure control to the map. — addMeasure","text":"","code":"addMeasure( map, position = \"topright\", primaryLengthUnit = \"feet\", secondaryLengthUnit = NULL, primaryAreaUnit = \"acres\", secondaryAreaUnit = NULL, activeColor = \"#ABE67E\", completedColor = \"#C8F2BE\", popupOptions = list(className = \"leaflet-measure-resultpopup\", autoPanPadding = c(10, 10)), captureZIndex = 10000, localization = \"en\", decPoint = \".\", thousandsSep = \",\" )"},{"path":"https://rstudio.github.io/leaflet/reference/addMeasure.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a measure control to the map. — addMeasure","text":"map map widget object position standard Leaflet control position options. primaryLengthUnit, secondaryLengthUnit units used display length results. secondaryLengthUnit optional. Valid values \"feet\", \"meters\", \"miles\", \"kilometers\". primaryAreaUnit, secondaryAreaUnit units used display area results. secondaryAreaUnit optional. Valid values \"acres\", \"hectares\", \"sqmeters\", \"sqmiles\". activeColor base color use map features rendered actively performing measurement. Value color represented hexadecimal string. completedColor base color use features generated completed measurement. Value color represented hexadecimal string. popupOptions list options applied popup resulting measure feature. Properties may standard Leaflet popup options. captureZIndex Z-index marker used capture measure clicks. Set value higher z-index map layers disable click events layers measurement active. localization Locale translate displayed text. Available locales include en (default), cn, de, es, fr, , nl, pt, pt_BR, pt_PT, ru, tr decPoint Decimal point used displaying measurements. specified, values defined localization. thousandsSep Thousands separator used displaying measurements. specified, values defined localization.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMeasure.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Add a measure control to the map. — addMeasure","text":"modified map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMeasure.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a measure control to the map. — addMeasure","text":"","code":"leaf <- leaflet() %>% addTiles() %>% # central park fitBounds( -73.9, 40.75, -73.95, 40.8 ) %>% addMeasure() leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMeasure\",\"args\":[{\"position\":\"topright\",\"primaryLengthUnit\":\"feet\",\"primaryAreaUnit\":\"acres\",\"activeColor\":\"#ABE67E\",\"completedColor\":\"#C8F2BE\",\"popupOptions\":{\"className\":\"leaflet-measure-resultpopup\",\"autoPanPadding\":[10,10]},\"captureZIndex\":10000,\"localization\":\"en\",\"decPoint\":\".\",\"thousandsSep\":\",\"}]}],\"fitBounds\":[40.75,-73.90000000000001,40.8,-73.95,[]]},\"evals\":[],\"jsHooks\":[]} # customizing leaf %>% addMeasure( position = \"bottomleft\", primaryLengthUnit = \"meters\", primaryAreaUnit = \"sqmeters\", activeColor = \"#3D535D\", completedColor = \"#7D4479\", localization = \"de\" ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMeasure\",\"args\":[{\"position\":\"topright\",\"primaryLengthUnit\":\"feet\",\"primaryAreaUnit\":\"acres\",\"activeColor\":\"#ABE67E\",\"completedColor\":\"#C8F2BE\",\"popupOptions\":{\"className\":\"leaflet-measure-resultpopup\",\"autoPanPadding\":[10,10]},\"captureZIndex\":10000,\"localization\":\"en\",\"decPoint\":\".\",\"thousandsSep\":\",\"}]},{\"method\":\"addMeasure\",\"args\":[{\"position\":\"bottomleft\",\"primaryLengthUnit\":\"meters\",\"primaryAreaUnit\":\"sqmeters\",\"activeColor\":\"#3D535D\",\"completedColor\":\"#7D4479\",\"popupOptions\":{\"className\":\"leaflet-measure-resultpopup\",\"autoPanPadding\":[10,10]},\"captureZIndex\":10000,\"localization\":\"de\",\"decPoint\":\".\",\"thousandsSep\":\",\"}]}],\"fitBounds\":[40.75,-73.90000000000001,40.8,-73.95,[]]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addMiniMap.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a minimap to the map — addMiniMap","title":"Add a minimap to the map — addMiniMap","text":"Add minimap map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addMiniMap.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a minimap to the map — addMiniMap","text":"","code":"addMiniMap( map, position = \"bottomright\", width = 150, height = 150, collapsedWidth = 19, collapsedHeight = 19, zoomLevelOffset = -5, zoomLevelFixed = FALSE, centerFixed = FALSE, zoomAnimation = FALSE, toggleDisplay = FALSE, autoToggleDisplay = FALSE, minimized = FALSE, aimingRectOptions = list(color = \"#ff7800\", weight = 1, clickable = FALSE), shadowRectOptions = list(color = \"#000000\", weight = 1, clickable = FALSE, opacity = 0, fillOpacity = 0), strings = list(hideText = \"Hide MiniMap\", showText = \"Show MiniMap\"), tiles = NULL, mapOptions = list() )"},{"path":"https://rstudio.github.io/leaflet/reference/addMiniMap.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a minimap to the map — addMiniMap","text":"map map widget object position standard Leaflet.Control position parameter, used like controls. Defaults \"bottomright\". width width minimap pixels. Defaults 150. height height minimap pixels. Defaults 150. collapsedWidth width toggle marker minimap collapsed, pixels. Defaults 19. collapsedHeight height toggle marker minimap collapsed, pixels. Defaults 19. zoomLevelOffset offset applied zoom minimap compared zoom main map. Can positive negative, defaults -5. zoomLevelFixed Overrides offset apply fixed zoom level minimap regardless main map zoom. Set valid zoom level, unset zoomLevelOffset used instead. centerFixed Applies fixed position minimap regardless main map's view / position. Prevents panning minimap, allow zooming (minimap main map). minimap zoomed, always zoom around centerFixed point. can pass LatLng-equivalent object. Defaults false. zoomAnimation Sets whether minimap animated zoom. (cause lag bit movement main map.) Defaults false. toggleDisplay Sets whether minimap button minimize . Defaults false. autoToggleDisplay Sets whether minimap hide automatically, parent map bounds fit within minimap bounds. Especially useful 'zoomLevelFixed' set. minimized Sets whether minimap start minimized position. aimingRectOptions Sets style aiming rectangle passing Path.Options (https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#path-options) object. (Clickable always overridden set false.) shadowRectOptions Sets style aiming shadow rectangle passing Path.Options (https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#path-option) object. (Clickable always overridden set false.) strings Overrides default strings allowing translation. tiles URL tiles one pre-defined providers. mapOptions Sets Leaflet options MiniMap map. override MiniMap default map options extends .","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/addMiniMap.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a minimap to the map — addMiniMap","text":"","code":"leaf <- leaflet() %>% addTiles() %>% addMiniMap() leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMiniMap\",\"args\":[null,null,\"bottomright\",150,150,19,19,-5,false,false,false,false,false,false,{\"color\":\"#ff7800\",\"weight\":1,\"clickable\":false},{\"color\":\"#000000\",\"weight\":1,\"clickable\":false,\"opacity\":0,\"fillOpacity\":0},{\"hideText\":\"Hide MiniMap\",\"showText\":\"Show MiniMap\"},[]]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addProviderTiles.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a tile layer from a known map provider — addProviderTiles","title":"Add a tile layer from a known map provider — addProviderTiles","text":"Add tile layer known map provider","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addProviderTiles.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a tile layer from a known map provider — addProviderTiles","text":"","code":"addProviderTiles( map, provider, layerId = NULL, group = NULL, options = providerTileOptions(), check = TRUE ) providerTileOptions( errorTileUrl = \"\", noWrap = FALSE, opacity = NULL, zIndex = NULL, updateWhenIdle = NULL, detectRetina = FALSE, ... )"},{"path":"https://rstudio.github.io/leaflet/reference/addProviderTiles.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a tile layer from a known map provider — addProviderTiles","text":"map map add tile layer provider name provider (see https://leaflet-extras.github.io/leaflet-providers/preview/ https://github.com/leaflet-extras/leaflet-providers) layerId layer id assign group name group newly created layers belong (clearGroup() addLayersControl() purposes). Human-friendly group names permitted–need short, identifier-style names. options tile options check Check specified provider matches available currently loaded leaflet providers? Defaults TRUE, can toggled FALSE advanced users. errorTileUrl, noWrap, opacity, zIndex, updateWhenIdle, detectRetina tile layer options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tilelayer ... named parameters add options","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addProviderTiles.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Add a tile layer from a known map provider — addProviderTiles","text":"modified map object","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addProviderTiles.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a tile layer from a known map provider — addProviderTiles","text":"","code":"leaflet() %>% addProviderTiles(\"Esri.WorldTopoMap\") %>% addProviderTiles(\"CartoDB.DarkMatter\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addProviderTiles\",\"args\":[\"Esri.WorldTopoMap\",null,null,{\"errorTileUrl\":\"\",\"noWrap\":false,\"detectRetina\":false}]},{\"method\":\"addProviderTiles\",\"args\":[\"CartoDB.DarkMatter\",null,null,{\"errorTileUrl\":\"\",\"noWrap\":false,\"detectRetina\":false}]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addRasterImage.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a raster image as a layer — addRasterImage","title":"Add a raster image as a layer — addRasterImage","text":"Create image overlay RasterLayer SpatRaster object. suitable small medium sized rasters, entire image embedded HTML page (passed websocket Shiny context).","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addRasterImage.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a raster image as a layer — addRasterImage","text":"","code":"addRasterImage( map, x, colors = if (is.factor(x)[1]) \"Set1\" else \"Spectral\", opacity = 1, attribution = NULL, layerId = NULL, group = NULL, project = TRUE, method = c(\"auto\", \"bilinear\", \"ngb\"), maxBytes = 4 * 1024 * 1024, options = gridOptions(), data = getMapData(map) ) projectRasterForLeaflet(x, method)"},{"path":"https://rstudio.github.io/leaflet/reference/addRasterImage.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a raster image as a layer — addRasterImage","text":"map map widget object x terra::SpatRaster() RasterLayer object–see raster::raster() colors color palette (see colorNumeric()) function use color raster values (hint: providing function, set na.color \"#00000000\" make NA areas transparent). palette ignored x SpatRaster color table RGB channels. opacity base opacity raster, expressed 0 1 attribution HTML string show attribution layer layerId layer id group name group raster image belong (see parameter addTiles()) project TRUE, automatically project x map projection expected Leaflet (EPSG:3857); FALSE, caller's responsibility ensure x already projected, extent(x) expressed WGS84 latitude/longitude coordinates method method used computing values new, projected raster image. \"bilinear\" (default) appropriate continuous data, \"ngb\" - nearest neighbor - appropriate categorical data. Ignored project = FALSE. See projectRaster() details. maxBytes maximum number bytes allow projected image (base64 encoding); defaults 4MB. options list additional options, intended provided call gridOptions() data data object argument values derived; default, data object provided leaflet() initially, can overridden","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addRasterImage.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Add a raster image as a layer — addRasterImage","text":"maxBytes parameter serves prevent accidentally embedding excessively large amount data htmlwidget. value compared size final compressed image (raster projected, colored, PNG encoded, base64 encoding applied). Set maxBytes Inf disable check, aware large rasters may make map large download also may cause browser become slow unresponsive. reduce size SpatRaster, can use terra::spatSample() x = spatSample(x, 100000, method=\"regular\", .raster=TRUE). RasterLayer can use raster::sampleRegular() sampleRegular(x, 100000, asRaster=TRUE). default, addRasterImage() project raster data x Pseudo-Mercator projection (EPSG:3857). can time-consuming operation even moderately sized rasters; although much faster SpatRasters RasterLayers. repeatedly adding particular raster Leaflet maps, can perform projection ahead time using projectRasterForLeaflet(), call addRasterImage() project = FALSE.","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/addRasterImage.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a raster image as a layer — addRasterImage","text":"","code":"library(raster) #> Loading required package: sp r <- raster(xmn = -2.8, xmx = -2.79, ymn = 54.04, ymx = 54.05, nrows = 30, ncols = 30) values(r) <- matrix(1:900, nrow(r), ncol(r), byrow = TRUE) crs(r) <- CRS(\"+init=epsg:4326\") #> Warning: GDAL Message 1: +init=epsg:XXXX syntax is deprecated. It might return a CRS with a non-EPSG compliant axis order. pal <- colorNumeric(\"Spectral\", domain = c(0, 1000)) leaflet() %>% addTiles() %>% addRasterImage(r, colors = pal, opacity = 0.8) %>% addLegend(pal = pal, values = c(0, 1000)) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addRasterImage\",\"args\":[\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAAB4AAAAeCAYAAAA7MK6iAAACJUlEQVRIiZ1V227bMAw9bNh1Ltrau7zsd/qj/cBtCQpkgAMs5R6sC0VStrOXyiLPTbSc0tvdq4AAIgBEaUVnXfpEABD0oPapXzDLn4Lh6QcrkYXshBGTyWGo6TUYUKPL08StUQJEAta85cUG6VHVlgf+MnLHJE6PxkRcfRsni/HTKAHBC5IV3mUaaadRDy9XBwqNUr/UDQaQIFx+FqfLw8vfyrXiZgrx6TynXoL63vM+P/PDlJPY70Cb6NtMrl4M1b2oWj4MQODD9yEQtESqp+oJBqF6U1iMvw1hg3ohgrHZAD6g5/Pd10ElNemDtXlnO/DxNwkwTc83EW416OEZ41NAWCNGuNuDMcbndWJkYvs9fKpTUGd6HPuCPbG1EDvDMR5H09gQ+x9TxycwhulG0h6cQNKal1zJBb7ef6qATJFMyvAPI5j6H2gNbL/RawPx5Xp2FIhJ3PRVRzYMnV7t85yMGwHZMCwjjAx14KznA/F8/ZM1AFCl1NdTeOn/k9rD4Ft+gwdBpO75dOEiUoxEE6IQ1OBdCFAnWK3xaWZjqge3hFg3qUG2pqX7fLwcDKCOLBaIQ7r+BpZ/z9QHdIS9ODkjjXVcAfjXbC/EPuPVXmBke/xz3icchQpPn2+z1DryZS1gAh/PB/WZUQLWS7NGLkaJC22e8FpL/d6Az6fPhqACdEylCVRPWCdlD+Ax/H58aMesiNrIYaTe/HKivC+4GlCUjgjwD8Ffj6cl3305AAAAAElFTkSuQmCC\",[[54.04999999999998,-2.799999999999999],[54.03999999999998,-2.79]],null,null,{\"tileSize\":256,\"zIndex\":1,\"minZoom\":0,\"opacity\":0.8}]},{\"method\":\"addLegend\",\"args\":[{\"colors\":[\"#9E0142 , #9E0142 0%, #F46D43 20%, #FEE08B 40%, #E6F598 60%, #66C2A5 80%, #5E4FA2 100%, #5E4FA2 \"],\"labels\":[\"0\",\"200\",\"400\",\"600\",\"800\",\"1,000\"],\"na_color\":null,\"na_label\":\"NA\",\"opacity\":0.5,\"position\":\"topright\",\"type\":\"numeric\",\"title\":null,\"extra\":{\"p_1\":0,\"p_n\":1},\"layerId\":null,\"className\":\"info legend\",\"group\":null}]}],\"limits\":{\"lat\":[54.03999999999998,54.04999999999998],\"lng\":[-2.799999999999999,-2.79]}},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addRasterLegend.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a color legend for a SpatRaster to a map — addRasterLegend","title":"Add a color legend for a SpatRaster to a map — addRasterLegend","text":"function adding legend specifically designed terra::SpatRaster objects, categorical values, carry color table.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addRasterLegend.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a color legend for a SpatRaster to a map — addRasterLegend","text":"","code":"addRasterLegend(map, x, layer = 1, ...)"},{"path":"https://rstudio.github.io/leaflet/reference/addRasterLegend.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a color legend for a SpatRaster to a map — addRasterLegend","text":"map map widget object x SpatRaster object color table layer layer raster target ... additional arguments pass addLegend()","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/addRasterLegend.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a color legend for a SpatRaster to a map — addRasterLegend","text":"","code":"if (FALSE) { # interactive() library(terra) r <- rast(\"/vsicurl/https://geodata.ucdavis.edu/test/pr_nlcd.tif\") leaflet() %>% addTiles() %>% addRasterImage(r, opacity = 0.75) %>% addRasterLegend(r, opacity = 0.75) plot.new() # pause in interactive mode rr <- r levels(rr) <- NULL leaflet() %>% addTiles() %>% addRasterImage(rr, opacity = 0.75) %>% addRasterLegend(rr, opacity = 0.75) }"},{"path":"https://rstudio.github.io/leaflet/reference/addScaleBar.html","id":null,"dir":"Reference","previous_headings":"","what":"Add or remove a scale bar — addScaleBar","title":"Add or remove a scale bar — addScaleBar","text":"Uses Leaflet's built-scale bar feature add scale bar.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addScaleBar.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add or remove a scale bar — addScaleBar","text":"","code":"addScaleBar( map, position = c(\"topright\", \"bottomright\", \"bottomleft\", \"topleft\"), options = scaleBarOptions() ) scaleBarOptions( maxWidth = 100, metric = TRUE, imperial = TRUE, updateWhenIdle = TRUE ) removeScaleBar(map)"},{"path":"https://rstudio.github.io/leaflet/reference/addScaleBar.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add or remove a scale bar — addScaleBar","text":"map map add scale bar position position control: \"topleft\", \"topright\", \"bottomleft\", \"bottomright\". options list additional options, intended provided call scaleBarOptions() maxWidth maximum width control pixels (default 100) metric TRUE (default), show scale bar metric units (m/km) imperial TRUE (default), show scale bar imperial units (ft/mi) updateWhenIdle FALSE (default), scale bar always --date (updated move). TRUE, control updated moveend.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addScaleBar.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add or remove a scale bar — addScaleBar","text":"","code":"# \\donttest{ leaflet() %>% addTiles() %>% addScaleBar() {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addScaleBar\",\"args\":[{\"maxWidth\":100,\"metric\":true,\"imperial\":true,\"updateWhenIdle\":true,\"position\":\"topright\"}]}]},\"evals\":[],\"jsHooks\":[]}# }"},{"path":"https://rstudio.github.io/leaflet/reference/addSimpleGraticule.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a simple Graticule on the map — addSimpleGraticule","title":"Add a simple Graticule on the map — addSimpleGraticule","text":"Add simple Graticule map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addSimpleGraticule.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a simple Graticule on the map — addSimpleGraticule","text":"","code":"addSimpleGraticule( map, interval = 20, showOriginLabel = TRUE, redraw = \"move\", hidden = FALSE, zoomIntervals = list(), layerId = NULL, group = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/addSimpleGraticule.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a simple Graticule on the map — addSimpleGraticule","text":"map map widget object interval spacing map units horizontal vertical lines. showOriginLabel true Whether show '(0,0)' origin. redraw map event redraw graticule. move default \"moveend\" can smoother. hidden hide start zoomIntervals use different intervals different zoom levels. specified, zoom levels use value interval option. layerId layer id group name group layer belongs .","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/addSimpleGraticule.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a simple Graticule on the map — addSimpleGraticule","text":"","code":"leaflet() %>% addTiles() %>% addSimpleGraticule() {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addSimpleGraticule\",\"args\":[20,true,\"move\",false,[],null,null]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/addTerminator.html","id":null,"dir":"Reference","previous_headings":"","what":"Add a daylight layer on top of the map — addTerminator","title":"Add a daylight layer on top of the map — addTerminator","text":"See https://github.com/joergdietrich/Leaflet.Terminator","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addTerminator.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Add a daylight layer on top of the map — addTerminator","text":"","code":"addTerminator( map, resolution = 2, time = NULL, layerId = NULL, group = NULL, options = pathOptions(pointerEvents = \"none\", clickable = FALSE) )"},{"path":"https://rstudio.github.io/leaflet/reference/addTerminator.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Add a daylight layer on top of the map — addTerminator","text":"map map widget object resolution step size terminator points computed. step size 1 degree/resolution, .e., higher resolution values smaller step sizes points polygon. default value 2. time Time layerId layer id group name group layer belongs . options path options daynight layer","code":""},{"path":"https://rstudio.github.io/leaflet/reference/addTerminator.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Add a daylight layer on top of the map — addTerminator","text":"","code":"leaf <- leaflet() %>% addTiles() %>% addTerminator() leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addTerminator\",\"args\":[2,null,null,null,{\"interactive\":false,\"pointerEvents\":\"none\",\"className\":\"\"}]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/atlStorms2005.html","id":null,"dir":"Reference","previous_headings":"","what":"Atlantic Ocean storms 2005 — atlStorms2005","title":"Atlantic Ocean storms 2005 — atlStorms2005","text":"Atlantic Ocean storms 2005","code":""},{"path":"https://rstudio.github.io/leaflet/reference/atlStorms2005.html","id":"format","dir":"Reference","previous_headings":"","what":"Format","title":"Atlantic Ocean storms 2005 — atlStorms2005","text":"sp::SpatialLinesDataFrame","code":""},{"path":"https://rstudio.github.io/leaflet/reference/atlStorms2005.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Atlantic Ocean storms 2005 — atlStorms2005","text":"dataset contains storm tracks selected storms Atlantic Ocean basin year 2005","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIconList.html","id":null,"dir":"Reference","previous_headings":"","what":"Make awesome-icon set — awesomeIconList","title":"Make awesome-icon set — awesomeIconList","text":"Make awesome-icon set","code":""},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIconList.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Make awesome-icon set — awesomeIconList","text":"","code":"awesomeIconList(...)"},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIconList.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Make awesome-icon set — awesomeIconList","text":"... icons created makeAwesomeIcon()","code":""},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIconList.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Make awesome-icon set — awesomeIconList","text":"","code":"iconSet <- awesomeIconList( home = makeAwesomeIcon(icon = \"Home\", library = \"fa\"), flag = makeAwesomeIcon(icon = \"Flag\", library = \"fa\") ) iconSet[c(\"home\", \"flag\")] #> $home #> $icon #> [1] \"Home\" #> #> $library #> [1] \"fa\" #> #> $markerColor #> [1] \"blue\" #> #> $iconColor #> [1] \"white\" #> #> $spin #> [1] FALSE #> #> $squareMarker #> [1] FALSE #> #> $iconRotate #> [1] 0 #> #> $font #> [1] \"monospace\" #> #> attr(,\"class\") #> [1] \"leaflet_awesome_icon\" #> #> $flag #> $icon #> [1] \"Flag\" #> #> $library #> [1] \"fa\" #> #> $markerColor #> [1] \"blue\" #> #> $iconColor #> [1] \"white\" #> #> $spin #> [1] FALSE #> #> $squareMarker #> [1] FALSE #> #> $iconRotate #> [1] 0 #> #> $font #> [1] \"monospace\" #> #> attr(,\"class\") #> [1] \"leaflet_awesome_icon\" #> #> attr(,\"class\") #> [1] \"leaflet_awesome_icon_set\""},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIcons.html","id":null,"dir":"Reference","previous_headings":"","what":"Create a list of awesome icon data — awesomeIcons","title":"Create a list of awesome icon data — awesomeIcons","text":"icon can represented list form list(icon, library, ...). function vectorized arguments create list icon data. Shorter argument values recycled. NULL values arguments ignored.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIcons.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Create a list of awesome icon data — awesomeIcons","text":"","code":"awesomeIcons( icon = \"home\", library = \"glyphicon\", markerColor = \"blue\", iconColor = \"white\", spin = FALSE, extraClasses = NULL, squareMarker = FALSE, iconRotate = 0, fontFamily = \"monospace\", text = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIcons.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Create a list of awesome icon data — awesomeIcons","text":"icon Name icon library icon library. Default \"glyphicon\", possible values \"fa\" (fontawesome) \"ion\" (ionicons). markerColor Possible values \"red\", \"darkred\", \"lightred\", \"orange\", \"beige\", \"green\", \"darkgreen\", \"lightgreen\", \"blue\", \"darkblue\", \"lightblue\", \"purple\", \"darkpurple\", \"pink\", \"cadetblue\", \"white\", \"gray\", \"lightgray\", \"black\" iconColor color use icon . Use CSS-valid color (hex, rgba, etc.) named web color. spin TRUE, make icon spin (works library = \"fa\") extraClasses Additional css classes include icon. squareMarker Whether use square marker. iconRotate Rotate icon given angle. fontFamily Used text option specified. text Use text string instead icon. Argument addAwesomeMarkers().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/awesomeIcons.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Create a list of awesome icon data — awesomeIcons","text":"list awesome-icon data can passed icon","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/breweries91.html","id":null,"dir":"Reference","previous_headings":"","what":"Selected breweries in Franconia — breweries91","title":"Selected breweries in Franconia — breweries91","text":"Selected breweries Franconia (zip code starting 91...)","code":""},{"path":"https://rstudio.github.io/leaflet/reference/breweries91.html","id":"format","dir":"Reference","previous_headings":"","what":"Format","title":"Selected breweries in Franconia — breweries91","text":"sp::SpatialPointsDataFrame","code":""},{"path":"https://rstudio.github.io/leaflet/reference/breweries91.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Selected breweries in Franconia — breweries91","text":"dataset contains selected breweries Franconia. subset larger database compiled students University Marburg seminar called \"Geography Beer, sustainability food industry\"","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":null,"dir":"Reference","previous_headings":"","what":"Color mapping — colorNumeric","title":"Color mapping — colorNumeric","text":"Conveniently maps data values (numeric factor/character) colors according given palette, can provided variety formats.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Color mapping — colorNumeric","text":"","code":"colorNumeric( palette, domain, na.color = \"#808080\", alpha = FALSE, reverse = FALSE ) colorBin( palette, domain, bins = 7, pretty = TRUE, na.color = \"#808080\", alpha = FALSE, reverse = FALSE, right = FALSE ) colorQuantile( palette, domain, n = 4, probs = seq(0, 1, length.out = n + 1), na.color = \"#808080\", alpha = FALSE, reverse = FALSE, right = FALSE ) colorFactor( palette, domain, levels = NULL, ordered = FALSE, na.color = \"#808080\", alpha = FALSE, reverse = FALSE )"},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Color mapping — colorNumeric","text":"palette colors color function values mapped domain possible values can mapped. colorNumeric() colorBin(), can simple numeric range (e.g., c(0, 100)); colorQuantile() needs representative numeric data; colorFactor() needs categorical data. NULL, whenever resulting color function called, x value represent domain. implies function invoked multiple times, encoding values colors may consistent; consistency needed, must provide non-NULL domain. na.color color return NA values. Note na.color = NA valid. alpha Whether alpha channels respected ignored. TRUE colors without explicit alpha information treated fully opaque. reverse Whether colors (color function) palette used reverse order. example, default order palette goes blue green, reverse = TRUE result colors going green blue. bins Either numeric vector two unique cut points single number (greater equal 2) giving number intervals domain values cut. pretty Whether use function pretty() generate bins argument bins single number. pretty = TRUE, actual number bins may number bins specified. pretty = FALSE, seq() used generate bins breaks may \"pretty\". right parameter supplied cut. See Details n Number equal-size quantiles desired. precise control, use probs instead. probs See stats::quantile(). provided, n ignored. levels alternate way specifying levels; specified, domain ignored ordered TRUE domain needs coerced factor, treat already correct order","code":""},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Color mapping — colorNumeric","text":"function takes single parameter x; called vector numbers (except colorFactor(), expects factors/characters), #RRGGBB color strings returned (unless alpha = TRUE case #RRGGBBAA may also possible).","code":""},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Color mapping — colorNumeric","text":"colorNumeric() simple linear mapping continuous numeric data interpolated palette. colorBin() also maps continuous numeric data, performs binning based value (see base::cut() function). colorBin() defaults base::cut() function include.lowest = TRUE right = FALSE. colorQuantile() similarly bins numeric data, via stats::quantile(). colorFactor() maps factors colors. palette discrete different number colors number factors, interpolation used. palette argument can following: character vector RGB named colors. Examples: palette(), c(\"#000000\", \"#0000FF\", \"#FFFFFF\"), topo.colors(10) name RColorBrewer palette, e.g., \"BuPu\" \"Greens\". full name viridis palette: \"magma\", \"inferno\", \"plasma\", \"viridis\", \"cividis\", \"rocket\", \"mako\", \"turbo\" function receives single value 0 1 returns color. Examples: colorRamp(c(\"#000000\", \"#FFFFFF\"), interpolate = \"spline\").","code":""},{"path":"https://rstudio.github.io/leaflet/reference/colorNumeric.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Color mapping — colorNumeric","text":"","code":"pal <- colorBin(\"Greens\", domain = 0:100) pal(runif(10, 60, 100)) #> [1] \"#31A354\" \"#31A354\" \"#31A354\" \"#31A354\" \"#31A354\" \"#31A354\" \"#006D2C\" #> [8] \"#31A354\" \"#006D2C\" \"#006D2C\" if (interactive()) { # Exponential distribution, mapped continuously previewColors(colorNumeric(\"Blues\", domain = NULL), sort(rexp(16))) # Exponential distribution, mapped by interval previewColors(colorBin(\"Blues\", domain = NULL, bins = 4), sort(rexp(16))) # Exponential distribution, mapped by quantile previewColors(colorQuantile(\"Blues\", domain = NULL), sort(rexp(16))) # Categorical data; by default, the values being colored span the gamut... previewColors(colorFactor(\"RdYlBu\", domain = NULL), LETTERS[1:5]) # ...unless the data is a factor, without droplevels... previewColors(colorFactor(\"RdYlBu\", domain = NULL), factor(LETTERS[1:5], levels = LETTERS)) # ...or the domain is stated explicitly. previewColors(colorFactor(\"RdYlBu\", levels = LETTERS), LETTERS[1:5]) }"},{"path":"https://rstudio.github.io/leaflet/reference/deprecated.html","id":null,"dir":"Reference","previous_headings":"","what":"Legacy functions — createLeafletMap","title":"Legacy functions — createLeafletMap","text":"functions provided backwards compatibility first iteration leaflet bindings (https://github.com/jcheng5/leaflet-shiny).","code":""},{"path":"https://rstudio.github.io/leaflet/reference/deprecated.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Legacy functions — createLeafletMap","text":"","code":"createLeafletMap(session, outputId) leafletMap( outputId, width, height, initialTileLayer = \"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\", initialTileLayerAttribution = NULL, options = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/deprecated.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Legacy functions — createLeafletMap","text":"session, outputId Deprecated width, height, initialTileLayer, initialTileLayerAttribution, options Deprecated","code":""},{"path":"https://rstudio.github.io/leaflet/reference/derivePoints.html","id":null,"dir":"Reference","previous_headings":"","what":"Normalize data to a data frame or Spatial object. — derivePoints","title":"Normalize data to a data frame or Spatial object. — derivePoints","text":"Given data object lng/lat arguments (may NULL) [meaning infer data], formula [evaluated respect data], vector data [used -]) return lng/lat data frame.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/derivePoints.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Normalize data to a data frame or Spatial object. — derivePoints","text":"","code":"derivePoints( data, lng = NULL, lat = NULL, missingLng = missing(lng), missingLat = missing(lat), funcName = \"f\" ) derivePolygons( data, lng = NULL, lat = NULL, missingLng = missing(lng), missingLat = missing(lat), funcName = \"f\" )"},{"path":"https://rstudio.github.io/leaflet/reference/derivePoints.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Normalize data to a data frame or Spatial object. — derivePoints","text":"data map data lng, lat longitude latitude missingLng whether lng missing missingLat whether lat missing funcName Name calling function (logging)","code":""},{"path":"https://rstudio.github.io/leaflet/reference/derivePoints.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Normalize data to a data frame or Spatial object. — derivePoints","text":"derivePoints() returns lng/lat data frame. derivePolygons() returns list bbox attributes.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/dispatch.html","id":null,"dir":"Reference","previous_headings":"","what":"Extension points for plugins — dispatch","title":"Extension points for plugins — dispatch","text":"Extension points plugins","code":""},{"path":"https://rstudio.github.io/leaflet/reference/dispatch.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Extension points for plugins — dispatch","text":"","code":"dispatch( map, funcName, leaflet = stop(paste(funcName, \"requires a map proxy object\")), leaflet_proxy = stop(paste(funcName, \"does not support map proxy objects\")) ) invokeMethod(map, data, method, ...)"},{"path":"https://rstudio.github.io/leaflet/reference/dispatch.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Extension points for plugins — dispatch","text":"map map object, returned leaflet() leafletProxy() funcName name function user called caused dispatch call; error message purposes leaflet action performed map leaflet() leaflet_proxy action performed map leafletProxy(). data data object used evaluating formulas ... method name JavaScript method invoke ... unnamed arguments passed JavaScript method","code":""},{"path":"https://rstudio.github.io/leaflet/reference/dispatch.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Extension points for plugins — dispatch","text":"dispatch() returns value leaflet leaflet_proxy(), error. invokeMethod() returns map object passed , possibly modified.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/easyButton.html","id":null,"dir":"Reference","previous_headings":"","what":"Create an easyButton statestate — easyButtonState","title":"Create an easyButton statestate — easyButtonState","text":"Create easyButton statestate Creates easy button. Add EasyButton map see https://github.com/CliffCloud/Leaflet.EasyButton Add easyButton bar map see https://github.com/CliffCloud/Leaflet.EasyButton","code":""},{"path":"https://rstudio.github.io/leaflet/reference/easyButton.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Create an easyButton statestate — easyButtonState","text":"","code":"easyButtonState(stateName, icon, title, onClick) easyButton( icon = NULL, title = NULL, onClick = NULL, position = \"topleft\", id = NULL, states = NULL ) addEasyButton(map, button) addEasyButtonBar(map, ..., position = \"topleft\", id = NULL)"},{"path":"https://rstudio.github.io/leaflet/reference/easyButton.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Create an easyButton statestate — easyButtonState","text":"stateName unique name state icon button icon title text show hover onClick action take position topleft|topright|bottomleft|bottomright id id button states states map map widget object button button object created easyButton() ... list buttons created easyButton()","code":""},{"path":"https://rstudio.github.io/leaflet/reference/easyButton.html","id":"functions","dir":"Reference","previous_headings":"","what":"Functions","title":"Create an easyButton statestate — easyButtonState","text":"easyButtonState(): state easyButton. addEasyButton(): add EasyButton map addEasyButtonBar(): add EasyButton map","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/easyButton.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Create an easyButton statestate — easyButtonState","text":"","code":"leaf <- leaflet() %>% addTiles() %>% addEasyButton(easyButton( icon = htmltools::span(class = \"star\", htmltools::HTML(\"★\")), onClick = JS(\"function(btn, map){ map.setZoom(1);}\"))) leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addEasyButton\",\"args\":[{\"icon\":\"★<\\/span>\",\"title\":[],\"onClick\":\"function(btn, map){ map.setZoom(1);}\",\"position\":\"topleft\"}]}]},\"evals\":[\"calls.1.args.0.onClick\"],\"jsHooks\":[]} leaf <- leaflet() %>% addTiles() %>% addEasyButtonBar( easyButton( icon = htmltools::span(class = \"star\", htmltools::HTML(\"★\")), onClick = JS(\"function(btn, map){ alert(\\\"Button 1\\\");}\")), easyButton( icon = htmltools::span(class = \"star\", htmltools::HTML(\"⌖\")), onClick = JS(\"function(btn, map){ alert(\\\"Button 2\\\");}\"))) leaf {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addEasyButtonBar\",\"args\":[[{\"icon\":\"★<\\/span>\",\"title\":[],\"onClick\":\"function(btn, map){ alert(\\\"Button 1\\\");}\",\"position\":\"topleft\"},{\"icon\":\"⌖<\\/span>\",\"title\":[],\"onClick\":\"function(btn, map){ alert(\\\"Button 2\\\");}\",\"position\":\"topleft\"}],\"topleft\",null]}]},\"evals\":[\"calls.1.args.0.0.onClick\",\"calls.1.args.0.1.onClick\"],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/evalFormula.html","id":null,"dir":"Reference","previous_headings":"","what":"Evaluate list members that are formulae, using the map data as the environment — evalFormula","title":"Evaluate list members that are formulae, using the map data as the environment — evalFormula","text":"Evaluates provided. Otherwise, formula environment evaluated.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/evalFormula.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Evaluate list members that are formulae, using the map data as the environment — evalFormula","text":"","code":"evalFormula(list, data)"},{"path":"https://rstudio.github.io/leaflet/reference/evalFormula.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Evaluate list members that are formulae, using the map data as the environment — evalFormula","text":"list members formulae data map data","code":""},{"path":"https://rstudio.github.io/leaflet/reference/expandLimits.html","id":null,"dir":"Reference","previous_headings":"","what":"Notifies the map of new latitude/longitude of items of interest on the map — expandLimits","title":"Notifies the map of new latitude/longitude of items of interest on the map — expandLimits","text":"Notifies map new latitude/longitude items interest map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/expandLimits.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Notifies the map of new latitude/longitude of items of interest on the map — expandLimits","text":"","code":"expandLimits(map, lat, lng)"},{"path":"https://rstudio.github.io/leaflet/reference/expandLimits.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Notifies the map of new latitude/longitude of items of interest on the map — expandLimits","text":"map map object lat vector latitudes lng vector longitudes","code":""},{"path":"https://rstudio.github.io/leaflet/reference/expandLimitsBbox.html","id":null,"dir":"Reference","previous_headings":"","what":"Notifies the map of polygons of interest on the map — expandLimitsBbox","title":"Notifies the map of polygons of interest on the map — expandLimitsBbox","text":"expandLimits(), takes polygon (presumably bbox attr) rather lat/lng.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/expandLimitsBbox.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Notifies the map of polygons of interest on the map — expandLimitsBbox","text":"","code":"expandLimitsBbox(map, poly)"},{"path":"https://rstudio.github.io/leaflet/reference/expandLimitsBbox.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Notifies the map of polygons of interest on the map — expandLimitsBbox","text":"map map object poly spatial object representing polygon.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/filterNULL.html","id":null,"dir":"Reference","previous_headings":"","what":"Remove NULL elements from a list — filterNULL","title":"Remove NULL elements from a list — filterNULL","text":"Remove NULL elements list","code":""},{"path":"https://rstudio.github.io/leaflet/reference/filterNULL.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Remove NULL elements from a list — filterNULL","text":"","code":"filterNULL(x)"},{"path":"https://rstudio.github.io/leaflet/reference/filterNULL.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Remove NULL elements from a list — filterNULL","text":"x list.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/filterNULL.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Remove NULL elements from a list — filterNULL","text":"list NULL elements filtered .","code":""},{"path":"https://rstudio.github.io/leaflet/reference/gadmCHE.html","id":null,"dir":"Reference","previous_headings":"","what":"Administrative borders of Switzerland (level 1) — gadmCHE","title":"Administrative borders of Switzerland (level 1) — gadmCHE","text":"Administrative borders Switzerland (level 1)","code":""},{"path":"https://rstudio.github.io/leaflet/reference/gadmCHE.html","id":"format","dir":"Reference","previous_headings":"","what":"Format","title":"Administrative borders of Switzerland (level 1) — gadmCHE","text":"sp::SpatialPolygonsDataFrame","code":""},{"path":"https://rstudio.github.io/leaflet/reference/gadmCHE.html","id":"source","dir":"Reference","previous_headings":"","what":"Source","title":"Administrative borders of Switzerland (level 1) — gadmCHE","text":"https://gadm.org","code":""},{"path":"https://rstudio.github.io/leaflet/reference/gadmCHE.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Administrative borders of Switzerland (level 1) — gadmCHE","text":"dataset comes https://gadm.org. downloaded using getData().","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/getMapData.html","id":null,"dir":"Reference","previous_headings":"","what":"Extract the map's data — getMapData","title":"Extract the map's data — getMapData","text":"Extract map's data","code":""},{"path":"https://rstudio.github.io/leaflet/reference/getMapData.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Extract the map's data — getMapData","text":"","code":"getMapData(map)"},{"path":"https://rstudio.github.io/leaflet/reference/getMapData.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Extract the map's data — getMapData","text":"map map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/getMapData.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Extract the map's data — getMapData","text":"map's data","code":""},{"path":"https://rstudio.github.io/leaflet/reference/groupOptions.html","id":null,"dir":"Reference","previous_headings":"","what":"Set options on layer groups — groupOptions","title":"Set options on layer groups — groupOptions","text":"Change options layer groups. Currently option control zoom levels layer group displayed . zoomLevels option compatible layers control; assign group zoom levels use addLayersControl().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/groupOptions.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Set options on layer groups — groupOptions","text":"","code":"groupOptions(map, group, zoomLevels = NULL)"},{"path":"https://rstudio.github.io/leaflet/reference/groupOptions.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Set options on layer groups — groupOptions","text":"map map modify group character vector one group names set options zoomLevels numeric vector zoom levels group(s) visible, TRUE display zoom levels","code":""},{"path":"https://rstudio.github.io/leaflet/reference/groupOptions.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Set options on layer groups — groupOptions","text":"","code":"pal <- colorQuantile(\"YlOrRd\", quakes$mag) leaflet() %>% # Basic markers addTiles(group = \"basic\") %>% addMarkers(data = quakes, group = \"basic\") %>% # When zoomed in, we'll show circles at the base of each marker whose # radius and color reflect the magnitude addProviderTiles(providers$Esri.WorldTopoMap, group = \"detail\") %>% addCircleMarkers(data = quakes, group = \"detail\", fillOpacity = 0.5, radius = ~mag * 5, color = ~pal(mag), stroke = FALSE) %>% # Set the detail group to only appear when zoomed in groupOptions(\"detail\", zoomLevels = 7:18) #> Assuming \"long\" and \"lat\" are longitude and latitude, respectively #> Assuming \"long\" and \"lat\" are longitude and latitude, respectively {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,\"basic\",{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMarkers\",\"args\":[[-20.42,-20.62,-26,-17.97,-20.42,-19.68,-11.7,-28.11,-28.74,-17.47,-21.44,-12.26,-18.54,-21,-20.7,-15.94,-13.64,-17.83,-23.5,-22.63,-20.84,-10.98,-23.3,-30.2,-19.66,-17.94,-14.72,-16.46,-20.97,-19.84,-22.58,-16.32,-15.55,-23.55,-16.3,-25.82,-18.73,-17.64,-17.66,-18.82,-37.37,-15.31,-24.97,-15.49,-19.23,-30.1,-26.4,-11.77,-24.12,-18.97,-18.75,-19.26,-22.75,-21.37,-20.1,-19.85,-22.7,-22.06,-17.8,-24.2,-20.69,-21.16,-13.82,-11.49,-20.68,-17.1,-20.14,-21.96,-20.42,-15.46,-15.31,-19.86,-11.55,-23.74,-17.7,-23.54,-19.21,-12.11,-21.81,-28.98,-34.02,-23.84,-19.57,-20.12,-17.7,-19.66,-21.5,-23.64,-15.43,-15.41,-15.48,-13.36,-20.64,-19.72,-15.44,-19.73,-27.24,-18.16,-13.66,-24.57,-16.98,-26.2,-21.88,-33,-21.33,-19.44,-34.89,-20.24,-22.55,-36.95,-15.75,-16.85,-19.06,-26.11,-26.2,-26.13,-13.66,-13.47,-14.6,-18.96,-14.65,-19.9,-22.05,-19.22,-31.24,-17.93,-19.3,-26.53,-27.72,-19.19,-17.43,-17.05,-19.52,-23.71,-21.3,-16.24,-16.14,-23.95,-25.2,-18.84,-12.66,-20.65,-13.23,-29.91,-14.31,-20.1,-17.8,-21.27,-23.58,-17.9,-23.34,-15.56,-23.83,-11.8,-15.54,-20.65,-11.75,-24.81,-20.9,-11.34,-17.98,-24.34,-13.86,-35.56,-35.48,-34.2,-26,-19.89,-23.43,-18.89,-17.82,-25.68,-20.2,-15.2,-15.03,-32.22,-22.64,-17.42,-17.84,-15.02,-18.04,-24.6,-19.88,-20.3,-20.45,-17.67,-22.3,-19.85,-24.27,-15.85,-20.02,-18.56,-17.87,-24.08,-32.2,-20.36,-23.85,-24,-20.41,-17.72,-19.67,-17.7,-16.23,-26.72,-12.95,-21.97,-21.96,-20.32,-30.28,-20.2,-30.66,-16.17,-28.25,-20.47,-23.55,-20.94,-26.67,-18.13,-20.21,-18.31,-16.52,-22.36,-22.43,-20.37,-23.77,-13.65,-21.55,-16.24,-23.73,-22.34,-19.4,-24.64,-16,-19.62,-23.84,-23.54,-28.23,-21.68,-13.44,-24.96,-20.08,-24.36,-14.7,-18.2,-16.65,-18.11,-17.95,-15.5,-23.36,-19.15,-10.97,-14.85,-17.8,-22.5,-29.1,-20.32,-16.09,-19.18,-23.81,-23.79,-19.02,-20.9,-19.06,-17.88,-19.41,-26.17,-14.95,-18.73,-20.21,-21.29,-19.76,-22.09,-23.8,-20.16,-22.13,-17.44,-23.33,-24.78,-22,-19.13,-30.72,-22.32,-16.45,-17.7,-17.95,-24.4,-19.3,-21.13,-18.07,-20.6,-18.48,-13.34,-20.92,-25.31,-15.24,-16.4,-24.57,-17.94,-30.64,-18.64,-13.09,-19.68,-16.44,-21.09,-14.99,-23.3,-17.68,-22,-21.38,-32.62,-13.05,-12.93,-18.6,-21.34,-21.48,-17.4,-17.32,-18.77,-26.16,-12.59,-14.82,-21.79,-19.83,-29.5,-12.49,-26.1,-21.04,-10.78,-20.76,-11.41,-19.1,-23.91,-27.33,-12.25,-23.49,-27.18,-25.8,-27.19,-27.27,-27.1,-27.22,-27.38,-27.27,-27.54,-27.2,-27.71,-27.6,-27.38,-21.54,-27.21,-28.96,-12.01,-17.46,-30.17,-27.27,-17.79,-22.19,-17.1,-27.18,-11.64,-17.98,-16.9,-21.98,-32.14,-18.8,-26.78,-20.43,-18.3,-15.83,-23.44,-23.73,-19.89,-17.59,-19.77,-20.31,-15.33,-18.2,-15.36,-15.29,-15.36,-16.24,-13.47,-25.5,-14.32,-20.04,-28.83,-17.82,-27.23,-10.72,-27,-20.36,-27.17,-20.94,-17.46,-21.04,-23.7,-17.72,-15.87,-17.84,-13.45,-30.8,-11.63,-30.4,-26.18,-15.7,-17.95,-20.51,-15.36,-23.61,-33.2,-17.68,-22.24,-20.07,-25.04,-21.5,-14.28,-14.43,-32.7,-34.1,-19.7,-24.19,-26.6,-17.04,-22.1,-32.6,-33,-20.58,-20.61,-19.47,-17.47,-18.4,-23.33,-18.55,-26.16,-21.8,-27.63,-18.89,-20.3,-20.56,-16.1,-12.66,-21.05,-17.97,-19.83,-22.55,-22.28,-15.72,-20.85,-21.11,-25.31,-26.46,-24.09,-16.96,-23.19,-20.81,-15.03,-18.06,-19,-23.53,-18.18,-15.66,-18,-18.08,-18.05,-29.9,-20.9,-15.61,-16.03,-17.68,-31.94,-19.14,-18,-16.95,-10.79,-20.83,-32.9,-37.93,-29.09,-23.56,-19.6,-21.39,-14.85,-22.7,-32.42,-17.9,-23.58,-34.4,-17.61,-21.07,-13.84,-30.24,-18.49,-23.45,-16.04,-17.14,-22.54,-15.9,-30.04,-24.03,-18.89,-16.51,-20.1,-21.06,-13.07,-23.46,-19.41,-11.81,-11.76,-12.08,-25.59,-26.54,-20.9,-16.99,-23.46,-17.81,-15.17,-11.67,-20.75,-19.5,-26.18,-20.66,-19.22,-24.68,-15.43,-32.45,-21.31,-15.44,-13.26,-15.26,-33.57,-15.77,-15.79,-21,-16.28,-23.28,-16.1,-17.7,-15.96,-15.95,-17.56,-15.9,-15.29,-15.86,-16.2,-15.71,-16.45,-11.54,-19.61,-15.61,-21.16,-20.65,-20.33,-15.08,-23.28,-23.44,-23.12,-23.65,-22.91,-22.06,-13.56,-17.99,-23.92,-30.69,-21.92,-25.04,-19.92,-27.75,-17.71,-19.6,-34.68,-14.46,-18.85,-17.02,-20.41,-18.18,-16.49,-17.74,-20.49,-18.51,-27.28,-15.9,-20.57,-11.25,-20.04,-20.89,-16.62,-20.09,-24.96,-20.95,-23.31,-20.95,-21.58,-13.62,-12.72,-21.79,-20.48,-12.84,-17.02,-23.89,-23.07,-27.98,-28.1,-21.24,-21.24,-19.89,-32.82,-22,-21.57,-24.5,-33.03,-30.09,-22.75,-17.99,-19.6,-15.65,-17.78,-22.04,-20.06,-18.07,-12.85,-33.29,-34.63,-24.18,-23.78,-22.37,-23.97,-34.12,-25.25,-22.87,-18.48,-21.46,-28.56,-28.56,-21.3,-20.08,-18.82,-19.51,-12.05,-17.4,-23.93,-21.23,-16.23,-28.15,-20.81,-20.72,-23.29,-38.46,-15.48,-37.03,-20.48,-18.12,-18.17,-11.4,-23.1,-14.28,-22.87,-17.59,-27.6,-17.94,-17.88,-30.01,-19.19,-18.14,-23.46,-18.44,-18.21,-18.26,-15.85,-23.82,-18.6,-17.8,-10.78,-18.12,-19.34,-15.34,-24.97,-15.97,-23.47,-23.11,-20.54,-18.92,-20.16,-25.48,-18.19,-15.35,-18.69,-18.89,-17.61,-20.93,-17.6,-17.96,-18.8,-20.61,-20.74,-25.23,-23.9,-18.07,-15.43,-14.3,-18.04,-13.9,-17.64,-17.98,-25,-19.45,-16.11,-23.73,-17.74,-21.56,-20.97,-15.45,-15.93,-21.47,-21.44,-22.16,-13.36,-21.22,-26.1,-18.35,-17.2,-22.42,-17.91,-26.53,-26.5,-16.31,-18.76,-17.1,-19.28,-23.5,-21.26,-17.97,-26.02,-30.3,-24.89,-14.57,-15.4,-22.06,-25.14,-20.3,-25.28,-20.63,-19.02,-22.1,-38.59,-19.3,-31.03,-30.51,-22.55,-22.14,-25.6,-18.04,-21.29,-21.08,-20.64,-24.41,-12.16,-17.1,-21.13,-12.34,-16.43,-20.7,-21.18,-17.78,-21.57,-13.7,-12.27,-19.1,-19.85,-11.37,-20.7,-20.24,-16.4,-19.6,-21.63,-21.6,-21.77,-21.8,-21.05,-10.8,-17.9,-22.26,-22.33,-24.04,-20.4,-15,-27.87,-14.12,-23.61,-21.56,-21.19,-18.07,-26,-20.21,-28,-20.74,-31.8,-18.91,-20.45,-22.9,-18.11,-23.8,-23.42,-23.2,-12.93,-21.14,-19.13,-21.08,-20.07,-20.9,-25.04,-21.85,-19.34,-15.83,-23.73,-18.1,-22.12,-15.39,-16.21,-21.75,-22.1,-24.97,-19.36,-22.14,-21.48,-18.54,-21.62,-13.4,-15.5,-15.67,-21.78,-30.63,-15.7,-19.2,-19.7,-19.4,-15.85,-17.38,-24.33,-20.89,-18.97,-17.99,-15.8,-25.42,-21.6,-26.06,-17.56,-25.63,-25.46,-22.23,-21.55,-15.18,-13.79,-15.18,-18.78,-17.9,-18.5,-14.82,-15.65,-30.01,-13.16,-21.03,-21.4,-17.93,-20.87,-12.01,-19.1,-22.85,-17.08,-21.14,-12.23,-20.91,-11.38,-11.02,-22.09,-17.8,-18.94,-18.85,-21.91,-22.03,-18.1,-18.4,-21.2,-12,-11.7,-26.72,-24.39,-19.64,-21.35,-22.82,-38.28,-12.57,-22.24,-13.8,-21.07,-17.74,-23.87,-21.29,-22.2,-15.24,-17.82,-32.14,-19.3,-33.09,-20.18,-17.46,-17.44,-24.71,-21.53,-19.17,-28.05,-23.39,-22.33,-15.28,-20.27,-10.96,-21.52,-19.57,-23.08,-25.06,-17.85,-15.99,-20.56,-17.98,-18.4,-27.64,-20.99,-14.86,-29.33,-25.81,-14.1,-17.63,-23.47,-23.92,-20.88,-20.25,-19.33,-18.14,-22.41,-20.77,-17.95,-20.83,-27.84,-19.94,-23.6,-23.7,-30.39,-18.98,-27.89,-23.5,-23.73,-17.93,-35.94,-18.68,-23.47,-23.49,-23.85,-27.08,-20.88,-20.97,-21.71,-23.9,-15.78,-12.57,-19.69,-22.04,-17.99,-23.5,-21.4,-15.86,-23.95,-25.79,-23.75,-24.1,-18.56,-23.3,-17.03,-20.77,-28.1,-18.83,-23,-20.82,-22.95,-28.22,-27.99,-15.54,-12.37,-22.33,-22.7,-17.86,-16,-20.73,-15.45,-20.05,-17.95,-17.7,-25.93,-12.28,-20.13,-17.4,-21.59],[181.62,181.03,184.1,181.66,181.96,184.31,166.1,181.93,181.74,179.59,180.69,167,182.11,181.66,169.92,184.95,165.96,181.5,179.78,180.31,181.16,166.32,180.16,182,180.28,181.49,167.51,180.79,181.47,182.37,179.24,166.74,185.05,180.8,186,179.33,169.23,181.28,181.4,169.33,176.78,186.1,179.82,186.04,169.41,182.3,181.7,166.32,180.08,185.25,182.35,184.42,173.2,180.67,182.16,182.13,181,180.6,181.35,179.2,181.55,182.4,172.38,166.22,181.41,184.93,181.6,179.62,181.86,187.81,185.8,184.35,166.2,179.99,181.23,180.04,184.7,167.06,181.71,181.11,180.21,180.99,182.38,183.4,181.7,184.31,170.5,179.96,186.3,186.44,167.53,167.06,182.02,169.71,185.26,182.4,181.11,183.41,166.54,179.92,185.61,178.41,180.39,181.6,180.69,183.5,180.6,169.49,185.9,177.81,185.23,182.31,182.45,178.3,178.35,178.31,172.23,172.29,167.4,169.48,166.97,178.9,180.4,182.43,180.6,167.89,183.84,178.57,181.7,183.51,185.43,181.22,168.98,180.3,180.82,168.02,187.32,182.8,182.6,184.16,169.46,181.4,167.1,181.43,173.5,184.4,185.17,173.49,180.17,181.5,184.5,167.62,182.56,165.8,167.68,181.32,166.07,180,169.84,166.24,180.5,179.52,167.16,180.2,179.9,179.43,182.12,183.84,180,169.42,181.83,180.34,180.9,184.68,182.29,180.2,180.64,185.16,181.48,184.24,181.75,183.5,184.3,183,181.85,187.09,181.9,181.85,179.88,185.13,184.09,169.31,182,179.5,179.61,181.19,182.53,182.75,181.74,180.3,182.18,182.2,183.59,183.35,169.09,182.32,180.54,181.69,180.62,182.3,180.13,184.1,181.71,185.68,180.27,181.58,182.4,181.52,183.83,182.39,185.7,171.65,184.48,182.1,180.16,166.66,182.9,185.75,182.53,171.52,180.94,180.81,182.82,185.35,180.13,179.93,182.68,180.63,166.53,180.22,182.74,182.84,166,183.68,185.51,181.67,181.65,186.9,180.01,169.5,166.26,167.24,181.38,170.4,182.1,180.88,184.89,169.33,179.36,179.89,184.23,181.51,169.01,181.47,183.05,184.2,167.24,168.8,182.37,180.85,181.41,180.38,179.9,181.99,180.38,181.4,180.18,179.22,180.52,182.51,180.1,180.54,177.77,185,184.68,179.85,180.6,185.32,181.57,182.28,181.49,166.2,181.5,179.69,186.21,185.86,178.4,181.51,181.2,169.32,169.28,184.14,185.74,181.38,171.39,179.7,181.36,180.53,181.39,181.5,169.58,169.63,181.91,181.41,183.78,181.02,181.03,169.24,179.5,167.1,167.32,183.48,182.04,182.31,166.36,182.3,181.2,165.77,185.77,166.24,183.87,180,182.6,166.6,179.07,182.18,182.1,182.18,182.38,182.18,182.28,181.7,182.5,182.5,182.39,182.47,182.4,182.39,185.48,182.43,182.61,166.29,181.32,182.02,182.36,181.32,171.4,182.68,182.53,166.47,181.58,185.72,179.6,179.9,169.21,183.61,182.37,183.2,182.51,182.93,179.99,184.08,181.09,181.4,184.06,186.75,181.6,186.66,186.42,186.71,167.95,167.14,182.82,167.33,182.01,181.66,181.49,180.98,165.99,183.88,186.16,183.68,181.26,181.9,181.2,179.6,181.42,188.13,181.3,170.3,182.16,166.14,181.4,178.59,184.5,181.5,182.3,167.51,180.23,181.6,186.8,184.56,169.14,180.1,185.2,167.26,167.26,181.7,181.8,186.2,180.38,182.77,186.8,179.71,180.9,182.4,181.24,182.6,169.15,180.96,183.4,180.26,182.23,178.47,183.2,182.93,169.48,182.3,182.04,185.32,166.37,184.68,168.52,182.54,183.81,183.52,185.64,181.59,181.5,180.15,182.5,179.68,167.7,182.8,184.7,167.32,181.59,185.6,179.99,180.63,186.8,180.62,180.7,180.86,181.16,181.9,167.5,185.43,181.11,180.57,184.36,185.48,185.94,166.06,185.9,181.6,177.47,183.2,180.23,185.2,180.68,184.87,183.3,181.21,181.3,183.4,180.5,181.2,181.13,170.62,181.63,169.04,180.23,183.54,185.31,172.91,185.3,181.2,180.22,184.46,187.1,186.3,183.81,166.87,180.09,182.3,165.98,165.96,165.76,180.02,183.63,184.28,187,180.17,181.82,187.2,166.02,184.52,186.9,179.79,185.77,182.54,183.33,167.38,181.15,180.84,167.18,167.01,183.13,180.8,167.01,166.83,183.2,166.94,184.6,167.25,181.31,166.69,167.34,181.59,167.42,166.9,166.85,166.8,166.91,167.54,166.18,181.91,187.15,181.41,182.22,168.71,166.62,184.61,184.6,184.42,184.46,183.95,180.47,166.49,181.57,184.47,182.1,182.8,180.97,183.91,182.26,181.18,183.84,179.82,167.26,187.55,182.41,186.51,182.04,187.8,181.31,181.69,182.64,183.4,167.16,181.33,166.36,181.87,181.25,186.74,168.75,179.87,181.42,179.27,181.06,181.9,167.15,166.28,185,169.76,166.78,182.93,182.39,184.03,181.96,182.25,180.81,180.86,174.46,179.8,185.5,185.62,180.92,180.2,182.4,170.99,168.98,181.87,186.26,181.53,184.91,168.69,181.54,165.67,181.3,179.1,179.02,180.31,171.5,179.91,181.75,179.86,172.65,182.37,181.02,183.47,183.59,180.92,183.22,182.21,183.97,167.39,186.54,180.18,181.09,167.91,183.4,185.01,181.41,184,176.03,186.73,177.52,181.38,181.88,181.98,166.07,180.12,170.34,171.72,180.98,182.1,180.6,180.58,180.8,182.3,180.87,180.11,181.04,180.87,180.98,184.83,180.09,184.28,181.32,166.1,181.71,182.62,167.1,182.85,186.08,180.24,179.15,181.66,169.37,184.27,180.94,181.74,186.4,169.1,181.24,183.32,181.54,181.5,181.4,182.41,182.44,181.53,179.86,179.9,181.58,185.19,167.32,181.57,167.18,177.01,181.51,180,184.48,187.48,179.98,186.78,183.23,181.72,186.73,167.91,185.86,170.45,180.49,172.76,181.51,182.5,185.27,182.9,171.4,181.48,178.3,178.29,168.08,169.71,182.8,182.78,180,181.69,181.48,181.2,180.8,179.67,167.24,186.87,183.95,178.42,181.4,181.17,181.61,186.83,185.3,175.7,183,181.59,181.3,183.34,180.64,180.3,181.84,185.77,180.85,169.66,180.03,167.03,185.9,185.6,167.43,186.73,184.3,180.92,185.33,183.86,166.75,167.41,184.52,184.51,166.55,186.3,185.1,182.73,184.53,180.77,180.5,181,183.6,180.9,165.8,181.5,171.44,171.46,184.85,186.1,184.62,183.4,166.64,180.27,185.5,181.58,181.65,178.43,181.9,182,180.7,180.6,169.46,182.1,183.8,181.63,184.7,180.21,184.8,169.52,181.06,184.97,181.3,181.75,182.02,179.84,180.89,186.59,167.1,183,181.72,180.49,185.1,186.52,180.67,180.4,179.54,186.36,179.62,182.44,168.93,182.4,166.9,185.3,185.23,183.11,180.9,185.1,184.37,182.44,182.29,185.9,168.63,179.97,185.26,169.44,181.62,185.25,182.65,169.9,180.05,181.23,180.26,179.98,180.48,181.39,185.93,166.56,167.23,186.72,181.41,185.4,171.17,185.17,181.15,167.24,180.78,180.78,181.89,181.7,166.66,169.63,181.37,185.96,174.21,167.02,181.57,167.05,167.01,180.58,181.2,182.43,182.2,181.28,179.77,181.63,184.84,181.4,166.2,166.3,182.69,178.98,169.5,170.04,184.52,177.1,167.11,180.28,166.53,183.78,181.25,180.15,185.8,180.58,185.11,181.27,180,185.86,180.94,181.62,181.42,181.33,179.85,170.52,169.53,182.39,179.97,171.51,185.98,181.51,165.97,169.75,184.47,183.45,182.8,181.44,167.95,184.41,181.61,181.77,182.22,181.02,167.32,182.72,182.54,166.01,185.13,180.21,180.21,185.18,184.75,186.16,181.71,183.99,181.16,181.73,181.01,182.1,182.39,183.99,184.13,182.4,182.32,182.92,184.9,184.49,181.62,178.52,184.5,179.95,180.06,180.26,183.44,184.95,181.2,183.58,184.6,167.44,166.72,184.23,183.95,181.59,180.13,180.74,166.98,184.64,182.38,184.5,184.5,169.05,184.68,185.74,183.71,183.5,182.26,170.7,181.67,170.56,183.6,183.5,187.15,166.93,171.66,170.3,181.3,184.53,181.42,181.42,183.86,181.37,188.1,179.54,167.06,184.2,187.8,170.56],null,null,\"basic\",{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"addProviderTiles\",\"args\":[\"Esri.WorldTopoMap\",null,\"detail\",{\"errorTileUrl\":\"\",\"noWrap\":false,\"detectRetina\":false}]},{\"method\":\"addCircleMarkers\",\"args\":[[-20.42,-20.62,-26,-17.97,-20.42,-19.68,-11.7,-28.11,-28.74,-17.47,-21.44,-12.26,-18.54,-21,-20.7,-15.94,-13.64,-17.83,-23.5,-22.63,-20.84,-10.98,-23.3,-30.2,-19.66,-17.94,-14.72,-16.46,-20.97,-19.84,-22.58,-16.32,-15.55,-23.55,-16.3,-25.82,-18.73,-17.64,-17.66,-18.82,-37.37,-15.31,-24.97,-15.49,-19.23,-30.1,-26.4,-11.77,-24.12,-18.97,-18.75,-19.26,-22.75,-21.37,-20.1,-19.85,-22.7,-22.06,-17.8,-24.2,-20.69,-21.16,-13.82,-11.49,-20.68,-17.1,-20.14,-21.96,-20.42,-15.46,-15.31,-19.86,-11.55,-23.74,-17.7,-23.54,-19.21,-12.11,-21.81,-28.98,-34.02,-23.84,-19.57,-20.12,-17.7,-19.66,-21.5,-23.64,-15.43,-15.41,-15.48,-13.36,-20.64,-19.72,-15.44,-19.73,-27.24,-18.16,-13.66,-24.57,-16.98,-26.2,-21.88,-33,-21.33,-19.44,-34.89,-20.24,-22.55,-36.95,-15.75,-16.85,-19.06,-26.11,-26.2,-26.13,-13.66,-13.47,-14.6,-18.96,-14.65,-19.9,-22.05,-19.22,-31.24,-17.93,-19.3,-26.53,-27.72,-19.19,-17.43,-17.05,-19.52,-23.71,-21.3,-16.24,-16.14,-23.95,-25.2,-18.84,-12.66,-20.65,-13.23,-29.91,-14.31,-20.1,-17.8,-21.27,-23.58,-17.9,-23.34,-15.56,-23.83,-11.8,-15.54,-20.65,-11.75,-24.81,-20.9,-11.34,-17.98,-24.34,-13.86,-35.56,-35.48,-34.2,-26,-19.89,-23.43,-18.89,-17.82,-25.68,-20.2,-15.2,-15.03,-32.22,-22.64,-17.42,-17.84,-15.02,-18.04,-24.6,-19.88,-20.3,-20.45,-17.67,-22.3,-19.85,-24.27,-15.85,-20.02,-18.56,-17.87,-24.08,-32.2,-20.36,-23.85,-24,-20.41,-17.72,-19.67,-17.7,-16.23,-26.72,-12.95,-21.97,-21.96,-20.32,-30.28,-20.2,-30.66,-16.17,-28.25,-20.47,-23.55,-20.94,-26.67,-18.13,-20.21,-18.31,-16.52,-22.36,-22.43,-20.37,-23.77,-13.65,-21.55,-16.24,-23.73,-22.34,-19.4,-24.64,-16,-19.62,-23.84,-23.54,-28.23,-21.68,-13.44,-24.96,-20.08,-24.36,-14.7,-18.2,-16.65,-18.11,-17.95,-15.5,-23.36,-19.15,-10.97,-14.85,-17.8,-22.5,-29.1,-20.32,-16.09,-19.18,-23.81,-23.79,-19.02,-20.9,-19.06,-17.88,-19.41,-26.17,-14.95,-18.73,-20.21,-21.29,-19.76,-22.09,-23.8,-20.16,-22.13,-17.44,-23.33,-24.78,-22,-19.13,-30.72,-22.32,-16.45,-17.7,-17.95,-24.4,-19.3,-21.13,-18.07,-20.6,-18.48,-13.34,-20.92,-25.31,-15.24,-16.4,-24.57,-17.94,-30.64,-18.64,-13.09,-19.68,-16.44,-21.09,-14.99,-23.3,-17.68,-22,-21.38,-32.62,-13.05,-12.93,-18.6,-21.34,-21.48,-17.4,-17.32,-18.77,-26.16,-12.59,-14.82,-21.79,-19.83,-29.5,-12.49,-26.1,-21.04,-10.78,-20.76,-11.41,-19.1,-23.91,-27.33,-12.25,-23.49,-27.18,-25.8,-27.19,-27.27,-27.1,-27.22,-27.38,-27.27,-27.54,-27.2,-27.71,-27.6,-27.38,-21.54,-27.21,-28.96,-12.01,-17.46,-30.17,-27.27,-17.79,-22.19,-17.1,-27.18,-11.64,-17.98,-16.9,-21.98,-32.14,-18.8,-26.78,-20.43,-18.3,-15.83,-23.44,-23.73,-19.89,-17.59,-19.77,-20.31,-15.33,-18.2,-15.36,-15.29,-15.36,-16.24,-13.47,-25.5,-14.32,-20.04,-28.83,-17.82,-27.23,-10.72,-27,-20.36,-27.17,-20.94,-17.46,-21.04,-23.7,-17.72,-15.87,-17.84,-13.45,-30.8,-11.63,-30.4,-26.18,-15.7,-17.95,-20.51,-15.36,-23.61,-33.2,-17.68,-22.24,-20.07,-25.04,-21.5,-14.28,-14.43,-32.7,-34.1,-19.7,-24.19,-26.6,-17.04,-22.1,-32.6,-33,-20.58,-20.61,-19.47,-17.47,-18.4,-23.33,-18.55,-26.16,-21.8,-27.63,-18.89,-20.3,-20.56,-16.1,-12.66,-21.05,-17.97,-19.83,-22.55,-22.28,-15.72,-20.85,-21.11,-25.31,-26.46,-24.09,-16.96,-23.19,-20.81,-15.03,-18.06,-19,-23.53,-18.18,-15.66,-18,-18.08,-18.05,-29.9,-20.9,-15.61,-16.03,-17.68,-31.94,-19.14,-18,-16.95,-10.79,-20.83,-32.9,-37.93,-29.09,-23.56,-19.6,-21.39,-14.85,-22.7,-32.42,-17.9,-23.58,-34.4,-17.61,-21.07,-13.84,-30.24,-18.49,-23.45,-16.04,-17.14,-22.54,-15.9,-30.04,-24.03,-18.89,-16.51,-20.1,-21.06,-13.07,-23.46,-19.41,-11.81,-11.76,-12.08,-25.59,-26.54,-20.9,-16.99,-23.46,-17.81,-15.17,-11.67,-20.75,-19.5,-26.18,-20.66,-19.22,-24.68,-15.43,-32.45,-21.31,-15.44,-13.26,-15.26,-33.57,-15.77,-15.79,-21,-16.28,-23.28,-16.1,-17.7,-15.96,-15.95,-17.56,-15.9,-15.29,-15.86,-16.2,-15.71,-16.45,-11.54,-19.61,-15.61,-21.16,-20.65,-20.33,-15.08,-23.28,-23.44,-23.12,-23.65,-22.91,-22.06,-13.56,-17.99,-23.92,-30.69,-21.92,-25.04,-19.92,-27.75,-17.71,-19.6,-34.68,-14.46,-18.85,-17.02,-20.41,-18.18,-16.49,-17.74,-20.49,-18.51,-27.28,-15.9,-20.57,-11.25,-20.04,-20.89,-16.62,-20.09,-24.96,-20.95,-23.31,-20.95,-21.58,-13.62,-12.72,-21.79,-20.48,-12.84,-17.02,-23.89,-23.07,-27.98,-28.1,-21.24,-21.24,-19.89,-32.82,-22,-21.57,-24.5,-33.03,-30.09,-22.75,-17.99,-19.6,-15.65,-17.78,-22.04,-20.06,-18.07,-12.85,-33.29,-34.63,-24.18,-23.78,-22.37,-23.97,-34.12,-25.25,-22.87,-18.48,-21.46,-28.56,-28.56,-21.3,-20.08,-18.82,-19.51,-12.05,-17.4,-23.93,-21.23,-16.23,-28.15,-20.81,-20.72,-23.29,-38.46,-15.48,-37.03,-20.48,-18.12,-18.17,-11.4,-23.1,-14.28,-22.87,-17.59,-27.6,-17.94,-17.88,-30.01,-19.19,-18.14,-23.46,-18.44,-18.21,-18.26,-15.85,-23.82,-18.6,-17.8,-10.78,-18.12,-19.34,-15.34,-24.97,-15.97,-23.47,-23.11,-20.54,-18.92,-20.16,-25.48,-18.19,-15.35,-18.69,-18.89,-17.61,-20.93,-17.6,-17.96,-18.8,-20.61,-20.74,-25.23,-23.9,-18.07,-15.43,-14.3,-18.04,-13.9,-17.64,-17.98,-25,-19.45,-16.11,-23.73,-17.74,-21.56,-20.97,-15.45,-15.93,-21.47,-21.44,-22.16,-13.36,-21.22,-26.1,-18.35,-17.2,-22.42,-17.91,-26.53,-26.5,-16.31,-18.76,-17.1,-19.28,-23.5,-21.26,-17.97,-26.02,-30.3,-24.89,-14.57,-15.4,-22.06,-25.14,-20.3,-25.28,-20.63,-19.02,-22.1,-38.59,-19.3,-31.03,-30.51,-22.55,-22.14,-25.6,-18.04,-21.29,-21.08,-20.64,-24.41,-12.16,-17.1,-21.13,-12.34,-16.43,-20.7,-21.18,-17.78,-21.57,-13.7,-12.27,-19.1,-19.85,-11.37,-20.7,-20.24,-16.4,-19.6,-21.63,-21.6,-21.77,-21.8,-21.05,-10.8,-17.9,-22.26,-22.33,-24.04,-20.4,-15,-27.87,-14.12,-23.61,-21.56,-21.19,-18.07,-26,-20.21,-28,-20.74,-31.8,-18.91,-20.45,-22.9,-18.11,-23.8,-23.42,-23.2,-12.93,-21.14,-19.13,-21.08,-20.07,-20.9,-25.04,-21.85,-19.34,-15.83,-23.73,-18.1,-22.12,-15.39,-16.21,-21.75,-22.1,-24.97,-19.36,-22.14,-21.48,-18.54,-21.62,-13.4,-15.5,-15.67,-21.78,-30.63,-15.7,-19.2,-19.7,-19.4,-15.85,-17.38,-24.33,-20.89,-18.97,-17.99,-15.8,-25.42,-21.6,-26.06,-17.56,-25.63,-25.46,-22.23,-21.55,-15.18,-13.79,-15.18,-18.78,-17.9,-18.5,-14.82,-15.65,-30.01,-13.16,-21.03,-21.4,-17.93,-20.87,-12.01,-19.1,-22.85,-17.08,-21.14,-12.23,-20.91,-11.38,-11.02,-22.09,-17.8,-18.94,-18.85,-21.91,-22.03,-18.1,-18.4,-21.2,-12,-11.7,-26.72,-24.39,-19.64,-21.35,-22.82,-38.28,-12.57,-22.24,-13.8,-21.07,-17.74,-23.87,-21.29,-22.2,-15.24,-17.82,-32.14,-19.3,-33.09,-20.18,-17.46,-17.44,-24.71,-21.53,-19.17,-28.05,-23.39,-22.33,-15.28,-20.27,-10.96,-21.52,-19.57,-23.08,-25.06,-17.85,-15.99,-20.56,-17.98,-18.4,-27.64,-20.99,-14.86,-29.33,-25.81,-14.1,-17.63,-23.47,-23.92,-20.88,-20.25,-19.33,-18.14,-22.41,-20.77,-17.95,-20.83,-27.84,-19.94,-23.6,-23.7,-30.39,-18.98,-27.89,-23.5,-23.73,-17.93,-35.94,-18.68,-23.47,-23.49,-23.85,-27.08,-20.88,-20.97,-21.71,-23.9,-15.78,-12.57,-19.69,-22.04,-17.99,-23.5,-21.4,-15.86,-23.95,-25.79,-23.75,-24.1,-18.56,-23.3,-17.03,-20.77,-28.1,-18.83,-23,-20.82,-22.95,-28.22,-27.99,-15.54,-12.37,-22.33,-22.7,-17.86,-16,-20.73,-15.45,-20.05,-17.95,-17.7,-25.93,-12.28,-20.13,-17.4,-21.59],[181.62,181.03,184.1,181.66,181.96,184.31,166.1,181.93,181.74,179.59,180.69,167,182.11,181.66,169.92,184.95,165.96,181.5,179.78,180.31,181.16,166.32,180.16,182,180.28,181.49,167.51,180.79,181.47,182.37,179.24,166.74,185.05,180.8,186,179.33,169.23,181.28,181.4,169.33,176.78,186.1,179.82,186.04,169.41,182.3,181.7,166.32,180.08,185.25,182.35,184.42,173.2,180.67,182.16,182.13,181,180.6,181.35,179.2,181.55,182.4,172.38,166.22,181.41,184.93,181.6,179.62,181.86,187.81,185.8,184.35,166.2,179.99,181.23,180.04,184.7,167.06,181.71,181.11,180.21,180.99,182.38,183.4,181.7,184.31,170.5,179.96,186.3,186.44,167.53,167.06,182.02,169.71,185.26,182.4,181.11,183.41,166.54,179.92,185.61,178.41,180.39,181.6,180.69,183.5,180.6,169.49,185.9,177.81,185.23,182.31,182.45,178.3,178.35,178.31,172.23,172.29,167.4,169.48,166.97,178.9,180.4,182.43,180.6,167.89,183.84,178.57,181.7,183.51,185.43,181.22,168.98,180.3,180.82,168.02,187.32,182.8,182.6,184.16,169.46,181.4,167.1,181.43,173.5,184.4,185.17,173.49,180.17,181.5,184.5,167.62,182.56,165.8,167.68,181.32,166.07,180,169.84,166.24,180.5,179.52,167.16,180.2,179.9,179.43,182.12,183.84,180,169.42,181.83,180.34,180.9,184.68,182.29,180.2,180.64,185.16,181.48,184.24,181.75,183.5,184.3,183,181.85,187.09,181.9,181.85,179.88,185.13,184.09,169.31,182,179.5,179.61,181.19,182.53,182.75,181.74,180.3,182.18,182.2,183.59,183.35,169.09,182.32,180.54,181.69,180.62,182.3,180.13,184.1,181.71,185.68,180.27,181.58,182.4,181.52,183.83,182.39,185.7,171.65,184.48,182.1,180.16,166.66,182.9,185.75,182.53,171.52,180.94,180.81,182.82,185.35,180.13,179.93,182.68,180.63,166.53,180.22,182.74,182.84,166,183.68,185.51,181.67,181.65,186.9,180.01,169.5,166.26,167.24,181.38,170.4,182.1,180.88,184.89,169.33,179.36,179.89,184.23,181.51,169.01,181.47,183.05,184.2,167.24,168.8,182.37,180.85,181.41,180.38,179.9,181.99,180.38,181.4,180.18,179.22,180.52,182.51,180.1,180.54,177.77,185,184.68,179.85,180.6,185.32,181.57,182.28,181.49,166.2,181.5,179.69,186.21,185.86,178.4,181.51,181.2,169.32,169.28,184.14,185.74,181.38,171.39,179.7,181.36,180.53,181.39,181.5,169.58,169.63,181.91,181.41,183.78,181.02,181.03,169.24,179.5,167.1,167.32,183.48,182.04,182.31,166.36,182.3,181.2,165.77,185.77,166.24,183.87,180,182.6,166.6,179.07,182.18,182.1,182.18,182.38,182.18,182.28,181.7,182.5,182.5,182.39,182.47,182.4,182.39,185.48,182.43,182.61,166.29,181.32,182.02,182.36,181.32,171.4,182.68,182.53,166.47,181.58,185.72,179.6,179.9,169.21,183.61,182.37,183.2,182.51,182.93,179.99,184.08,181.09,181.4,184.06,186.75,181.6,186.66,186.42,186.71,167.95,167.14,182.82,167.33,182.01,181.66,181.49,180.98,165.99,183.88,186.16,183.68,181.26,181.9,181.2,179.6,181.42,188.13,181.3,170.3,182.16,166.14,181.4,178.59,184.5,181.5,182.3,167.51,180.23,181.6,186.8,184.56,169.14,180.1,185.2,167.26,167.26,181.7,181.8,186.2,180.38,182.77,186.8,179.71,180.9,182.4,181.24,182.6,169.15,180.96,183.4,180.26,182.23,178.47,183.2,182.93,169.48,182.3,182.04,185.32,166.37,184.68,168.52,182.54,183.81,183.52,185.64,181.59,181.5,180.15,182.5,179.68,167.7,182.8,184.7,167.32,181.59,185.6,179.99,180.63,186.8,180.62,180.7,180.86,181.16,181.9,167.5,185.43,181.11,180.57,184.36,185.48,185.94,166.06,185.9,181.6,177.47,183.2,180.23,185.2,180.68,184.87,183.3,181.21,181.3,183.4,180.5,181.2,181.13,170.62,181.63,169.04,180.23,183.54,185.31,172.91,185.3,181.2,180.22,184.46,187.1,186.3,183.81,166.87,180.09,182.3,165.98,165.96,165.76,180.02,183.63,184.28,187,180.17,181.82,187.2,166.02,184.52,186.9,179.79,185.77,182.54,183.33,167.38,181.15,180.84,167.18,167.01,183.13,180.8,167.01,166.83,183.2,166.94,184.6,167.25,181.31,166.69,167.34,181.59,167.42,166.9,166.85,166.8,166.91,167.54,166.18,181.91,187.15,181.41,182.22,168.71,166.62,184.61,184.6,184.42,184.46,183.95,180.47,166.49,181.57,184.47,182.1,182.8,180.97,183.91,182.26,181.18,183.84,179.82,167.26,187.55,182.41,186.51,182.04,187.8,181.31,181.69,182.64,183.4,167.16,181.33,166.36,181.87,181.25,186.74,168.75,179.87,181.42,179.27,181.06,181.9,167.15,166.28,185,169.76,166.78,182.93,182.39,184.03,181.96,182.25,180.81,180.86,174.46,179.8,185.5,185.62,180.92,180.2,182.4,170.99,168.98,181.87,186.26,181.53,184.91,168.69,181.54,165.67,181.3,179.1,179.02,180.31,171.5,179.91,181.75,179.86,172.65,182.37,181.02,183.47,183.59,180.92,183.22,182.21,183.97,167.39,186.54,180.18,181.09,167.91,183.4,185.01,181.41,184,176.03,186.73,177.52,181.38,181.88,181.98,166.07,180.12,170.34,171.72,180.98,182.1,180.6,180.58,180.8,182.3,180.87,180.11,181.04,180.87,180.98,184.83,180.09,184.28,181.32,166.1,181.71,182.62,167.1,182.85,186.08,180.24,179.15,181.66,169.37,184.27,180.94,181.74,186.4,169.1,181.24,183.32,181.54,181.5,181.4,182.41,182.44,181.53,179.86,179.9,181.58,185.19,167.32,181.57,167.18,177.01,181.51,180,184.48,187.48,179.98,186.78,183.23,181.72,186.73,167.91,185.86,170.45,180.49,172.76,181.51,182.5,185.27,182.9,171.4,181.48,178.3,178.29,168.08,169.71,182.8,182.78,180,181.69,181.48,181.2,180.8,179.67,167.24,186.87,183.95,178.42,181.4,181.17,181.61,186.83,185.3,175.7,183,181.59,181.3,183.34,180.64,180.3,181.84,185.77,180.85,169.66,180.03,167.03,185.9,185.6,167.43,186.73,184.3,180.92,185.33,183.86,166.75,167.41,184.52,184.51,166.55,186.3,185.1,182.73,184.53,180.77,180.5,181,183.6,180.9,165.8,181.5,171.44,171.46,184.85,186.1,184.62,183.4,166.64,180.27,185.5,181.58,181.65,178.43,181.9,182,180.7,180.6,169.46,182.1,183.8,181.63,184.7,180.21,184.8,169.52,181.06,184.97,181.3,181.75,182.02,179.84,180.89,186.59,167.1,183,181.72,180.49,185.1,186.52,180.67,180.4,179.54,186.36,179.62,182.44,168.93,182.4,166.9,185.3,185.23,183.11,180.9,185.1,184.37,182.44,182.29,185.9,168.63,179.97,185.26,169.44,181.62,185.25,182.65,169.9,180.05,181.23,180.26,179.98,180.48,181.39,185.93,166.56,167.23,186.72,181.41,185.4,171.17,185.17,181.15,167.24,180.78,180.78,181.89,181.7,166.66,169.63,181.37,185.96,174.21,167.02,181.57,167.05,167.01,180.58,181.2,182.43,182.2,181.28,179.77,181.63,184.84,181.4,166.2,166.3,182.69,178.98,169.5,170.04,184.52,177.1,167.11,180.28,166.53,183.78,181.25,180.15,185.8,180.58,185.11,181.27,180,185.86,180.94,181.62,181.42,181.33,179.85,170.52,169.53,182.39,179.97,171.51,185.98,181.51,165.97,169.75,184.47,183.45,182.8,181.44,167.95,184.41,181.61,181.77,182.22,181.02,167.32,182.72,182.54,166.01,185.13,180.21,180.21,185.18,184.75,186.16,181.71,183.99,181.16,181.73,181.01,182.1,182.39,183.99,184.13,182.4,182.32,182.92,184.9,184.49,181.62,178.52,184.5,179.95,180.06,180.26,183.44,184.95,181.2,183.58,184.6,167.44,166.72,184.23,183.95,181.59,180.13,180.74,166.98,184.64,182.38,184.5,184.5,169.05,184.68,185.74,183.71,183.5,182.26,170.7,181.67,170.56,183.6,183.5,187.15,166.93,171.66,170.3,181.3,184.53,181.42,181.42,183.86,181.37,188.1,179.54,167.06,184.2,187.8,170.56],[24,21,27,20.5,20,20,24,22,23.5,21.5,22,23,22,22,30.5,21.5,30,22.5,22,22,22.5,21,22,23.5,27,20,23,26,22.5,22,23,23.5,24,20,22.5,21.5,22.5,23,20.5,22,23.5,23,22,21.5,23,24.5,22.5,22,21.5,25.5,21,20,23,21.5,21,22,22.5,20,22,21.5,23.5,20.5,25,23,24.5,23.5,20.5,25,22.5,27.5,20,22.5,21.5,26,22,21.5,20.5,22.5,21,26.5,26,22.5,23,21.5,20,21.5,23.5,22.5,21,21.5,25.5,23.5,26,21,21,20,22.5,26,25.5,23.5,20.5,23,23.5,23.5,23,21,22,23,28.5,25,22.5,21,20,24,22,21,26.5,23.5,24,21,24,21.5,23.5,22.5,22,25.5,21,25,24,21.5,22.5,21,22.5,23,21.5,23.5,25.5,23,24.5,21,23,20,25,22,21,21,22,24.5,26.5,20,28.5,32,21.5,21,23.5,23.5,21,21.5,24.5,23,20.5,24,23,23,24,25,28,26.5,23.5,22.5,21.5,23,20.5,20.5,20.5,28.5,25,22.5,20.5,23,22.5,21.5,22,21,20.5,24.5,21.5,24.5,23,23,26.5,23.5,23,20.5,23,21,23,22.5,21.5,26,21.5,20,23.5,22.5,22.5,21.5,26,22.5,23.5,21,23.5,21.5,20.5,27,21.5,21.5,21,23,22,21,23.5,23,24.5,21,22.5,24.5,21,22.5,25,25,23.5,21.5,22,24.5,22.5,20,22,25,23.5,24,22.5,20.5,26.5,24,25,23,21.5,23.5,26.5,21,23.5,22.5,25.5,24.5,22,21,23,23.5,21,24.5,25.5,23.5,22,22,21,24.5,23,22,23,22.5,22,24.5,20.5,21,28.5,23,25,21.5,22.5,26,22,21,23,20,22,23.5,21,23.5,22.5,25,25,24,23,23,25,25,28,20,20,23,22,24,23.5,23,21.5,23.5,20.5,24.5,23,24,24.5,25.5,27,22.5,24.5,22,20.5,26.5,22.5,24.5,24,26,22,22,24.5,22,21,23,23,26.5,26.5,22.5,22,25,25.5,22.5,22.5,27,22.5,23.5,21,24,22.5,21.5,21.5,21.5,23,22.5,25,23,23,24.5,20.5,27.5,23.5,25,25.5,27.5,23,23.5,21,20,27,21.5,22,23,25.5,22.5,21,20.5,25.5,27,25.5,25.5,22,28.5,22,25.5,23,27.5,25.5,22,25,25,25.5,25.5,21,22.5,20,24.5,21.5,24,22,21,24.5,21,26.5,25,28.5,26.5,23.5,23,21.5,27,22,21.5,21.5,23.5,22,21,22.5,24,24,21.5,22,25.5,22,22,21.5,24,21.5,22.5,20.5,25.5,23.5,23,23.5,23,22,21,20.5,23.5,20,24,22,21.5,22,22.5,22.5,23.5,21.5,23.5,24,23,25.5,23.5,21.5,25.5,27.5,22.5,21.5,21.5,23.5,21.5,21.5,23,22.5,22.5,27,23,22,25,26,22,25.5,22,22,24,22,23.5,23.5,22,21.5,25,22.5,23,27,23,22.5,22,22.5,20.5,20,24.5,20.5,26,22,20.5,24.5,23,22.5,24,21,21,20.5,27.5,22,24,21,24,24.5,23,22.5,22,23,21,23.5,22,22.5,24.5,23.5,27.5,23.5,23,20.5,23.5,23,21.5,22,23.5,21.5,20.5,23.5,22.5,27.5,22.5,23,25.5,22,23.5,27.5,23,20,23,24,23.5,23.5,21,27,23,27.5,21,22.5,22.5,24,23,27,23,25,21.5,21.5,24,23.5,23.5,24,21,21,29.5,23,22.5,24.5,23.5,24.5,26.5,21,21,22.5,26,22.5,28,26,24,22.5,25,22,22.5,23,22.5,26,25.5,24,21.5,25.5,23.5,23,24,23,22,23,25.5,21.5,22,23.5,24,20.5,23,24.5,20,23.5,23.5,26,23,23,24.5,28.5,23.5,22,24.5,24,23,22,24,23.5,21,25.5,24,24.5,25.5,21.5,22,23.5,23.5,26.5,25.5,24.5,22.5,23.5,21,25.5,24,21,24,22,22.5,21.5,28,20,25,21,23,23,22.5,25,23.5,23,24,23,22,28,21,27,24,28,22,23.5,23,25.5,23,22.5,21,24,24.5,27.5,25,21,26,24,22,24,22,20.5,24.5,23,22.5,26.5,24,23,24,23.5,24.5,26.5,22,23,21.5,22,21,20.5,21,25,20.5,21.5,26,21,22.5,22,22,25,20,24,25,21,26,26,22.5,21.5,22.5,23,25.5,22,21.5,23.5,28,24.5,25.5,23,22,24,21,23.5,20.5,23.5,20,24.5,25,22.5,22,20,22.5,23.5,22,23.5,23.5,20,21,22.5,23.5,22.5,20.5,23,21.5,23,26,23,23.5,25,26,22,23,22.5,20,21,26.5,29.5,24.5,22.5,22,27,26.5,25.5,20.5,21.5,22.5,20.5,25.5,26.5,22.5,20.5,22,23.5,20,25.5,20,21.5,21.5,20,20.5,22,21.5,21,20,22.5,23.5,25,21.5,25.5,23.5,26.5,25,22.5,25,20.5,24.5,20.5,20,22,22.5,22,22.5,21.5,21.5,25,22.5,22.5,22,22.5,20.5,24.5,23.5,21.5,23,23,26,22.5,21.5,23,20,22.5,24,23,20.5,24.5,23.5,20.5,21.5,22,20,24,22,22,23,21,20.5,21,20,20.5,20.5,23.5,24,25.5,25,24,22,25,26,21,20.5,24,22.5,25,25.5,20.5,23.5,26,24,22.5,20,23.5,20.5,21.5,21.5,20,23.5,20.5,21,24,24,21,21,28.5,30,21,22.5,24.5,22,20,21.5,21,22.5,24,22,21,21,25,21,26,22.5,23,25,25,27,24,21,27.5,21.5,20.5,22,24.5,22.5,24.5,20,22.5,25,24.5,22.5,21,21,21,26,21.5,25.5,23,23,22,22,24.5,25.5,21,23.5,20,28,26.5,25,21.5,20.5,25.5,22.5,24.5,27,23.5,24,22.5,21,23,23,28,27,20,26,21,23.5,21.5,24,23,27,24,23,21,27.5,23.5,23.5,22.5,27.5,22.5,20.5,20,21.5,23.5,24.5,22.5,23.5,22.5,24,21.5,20.5,27,20.5,24,21,24,27,22,26,23.5,24.5,24.5,21,22,22,21.5,24.5,25,23.5,24.5,21.5,22.5,21,26,24,20,23.5,21.5,21.5,24.5,20,21,22,23.5,22.5,22.5,30],null,\"detail\",{\"interactive\":true,\"className\":\"\",\"stroke\":false,\"color\":[\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#E31A1C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FD8D3C\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FD8D3C\",\"#FECC5C\",\"#E31A1C\",\"#FECC5C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FFFFB2\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#E31A1C\",\"#FFFFB2\",\"#FECC5C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#E31A1C\",\"#FD8D3C\",\"#E31A1C\",\"#FECC5C\",\"#FECC5C\",\"#FFFFB2\",\"#E31A1C\",\"#FD8D3C\",\"#FFFFB2\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\",\"#FFFFB2\",\"#FFFFB2\",\"#FECC5C\",\"#FD8D3C\",\"#FECC5C\",\"#FECC5C\",\"#E31A1C\"],\"fillOpacity\":0.5},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]},{\"method\":\"setGroupOptions\",\"args\":[\"detail\",{\"zoomLevels\":[7,8,9,10,11,12,13,14,15,16,17,18]}]}],\"limits\":{\"lat\":[-38.59,-10.72],\"lng\":[165.67,188.13]}},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/iconList.html","id":null,"dir":"Reference","previous_headings":"","what":"Make icon set — iconList","title":"Make icon set — iconList","text":"Make icon set","code":""},{"path":"https://rstudio.github.io/leaflet/reference/iconList.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Make icon set — iconList","text":"","code":"iconList(...)"},{"path":"https://rstudio.github.io/leaflet/reference/iconList.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Make icon set — iconList","text":"... icons created makeIcon()","code":""},{"path":"https://rstudio.github.io/leaflet/reference/iconList.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Make icon set — iconList","text":"","code":"iconSet <- iconList( red = makeIcon(\"leaf-red.png\", iconWidth = 32, iconHeight = 32), green = makeIcon(\"leaf-green.png\", iconWidth = 32, iconHeight = 32) ) iconSet[c(\"red\", \"green\", \"red\")] #> $red #> $iconUrl #> [1] \"leaf-red.png\" #> #> $iconWidth #> [1] 32 #> #> $iconHeight #> [1] 32 #> #> attr(,\"class\") #> [1] \"leaflet_icon\" #> #> $green #> $iconUrl #> [1] \"leaf-green.png\" #> #> $iconWidth #> [1] 32 #> #> $iconHeight #> [1] 32 #> #> attr(,\"class\") #> [1] \"leaflet_icon\" #> #> $red #> $iconUrl #> [1] \"leaf-red.png\" #> #> $iconWidth #> [1] 32 #> #> $iconHeight #> [1] 32 #> #> attr(,\"class\") #> [1] \"leaflet_icon\" #> #> attr(,\"class\") #> [1] \"leaflet_icon_set\""},{"path":"https://rstudio.github.io/leaflet/reference/icons.html","id":null,"dir":"Reference","previous_headings":"","what":"Create a list of icon data — icons","title":"Create a list of icon data — icons","text":"icon can represented list form list(iconUrl, iconSize, ...). function vectorized arguments create list icon data. Shorter argument values re-cycled. NULL values arguments ignored.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/icons.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Create a list of icon data — icons","text":"","code":"icons( iconUrl = NULL, iconRetinaUrl = NULL, iconWidth = NULL, iconHeight = NULL, iconAnchorX = NULL, iconAnchorY = NULL, shadowUrl = NULL, shadowRetinaUrl = NULL, shadowWidth = NULL, shadowHeight = NULL, shadowAnchorX = NULL, shadowAnchorY = NULL, popupAnchorX = NULL, popupAnchorY = NULL, className = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/icons.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Create a list of icon data — icons","text":"iconUrl URL file path icon image iconRetinaUrl URL file path retina sized version icon image iconWidth, iconHeight size icon image pixels iconAnchorX, iconAnchorY coordinates \"tip\" icon (relative top left corner, .e., top left corner means iconAnchorX = 0 iconAnchorY = 0), icon aligned point marker's geographical location shadowUrl URL file path icon shadow image shadowRetinaUrl URL file path retina sized version icon shadow image shadowWidth, shadowHeight size shadow image pixels shadowAnchorX, shadowAnchorY coordinates \"tip\" shadow popupAnchorX, popupAnchorY coordinates point popups \"open\", relative icon anchor className custom class name assign icon shadow images","code":""},{"path":"https://rstudio.github.io/leaflet/reference/icons.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Create a list of icon data — icons","text":"list icon data can passed icon argument addMarkers().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/icons.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Create a list of icon data — icons","text":"","code":"library(leaflet) # adapted from https://leafletjs.com/examples/custom-icons.html iconData <- data.frame( lat = c(rnorm(10, 0), rnorm(10, 1), rnorm(10, 2)), lng = c(rnorm(10, 0), rnorm(10, 3), rnorm(10, 6)), group = rep(sort(c(\"green\", \"red\", \"orange\")), each = 10), stringsAsFactors = FALSE ) leaflet() %>% addMarkers( data = iconData, icon = ~ icons( iconUrl = sprintf(\"https://leafletjs.com/examples/custom-icons/leaf-%s.png\", group), shadowUrl = \"https://leafletjs.com/examples/custom-icons/leaf-shadow.png\", iconWidth = 38, iconHeight = 95, shadowWidth = 50, shadowHeight = 64, iconAnchorX = 22, iconAnchorY = 94, shadowAnchorX = 4, shadowAnchorY = 62, popupAnchorX = -3, popupAnchorY = -76 ) ) #> Assuming \"lng\" and \"lat\" are longitude and latitude, respectively {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addMarkers\",\"args\":[[0.8606127123120325,-0.07039664564486807,-0.6131802136401736,-0.3367149598933609,-0.2158401838654685,0.6211322866457577,-1.284026516767093,-1.300092441187019,-0.3767694616563214,0.1037486464046915,0.2964377274177622,2.497413940475217,0.6971731224407478,-0.3768313346372614,1.883170174632431,1.671420279304275,2.230022375032784,2.645467878583005,0.8170739613360879,-0.3792578149375752,3.250600600755403,0.1237632251359568,1.631212431721527,-0.1292973082328839,2.337646026995419,0.4254251524874468,1.803680585151097,2.915060107809174,3.07863653772935,3.452802853952099],[-1.653281089225401,-2.761867517640907,0.2643691635372625,1.02457159426044,-0.6591855479869911,-0.3863043785226719,-0.2424989493525531,0.2205932400716209,-1.481090030207682,0.7246912044701421,0.6224852987382703,2.934590790574021,2.530295186887491,2.719483711932718,3.574836585356691,2.794323153937975,3.234880505242246,3.110628320902131,3.274202232513379,4.574919630070291,6.567767831624168,5.94038775012349,5.850412285405708,6.266168788377474,6.528403242689259,5.420611906885273,6.94219937374031,5.293638639848606,4.724597899666625,6.733259916535147],{\"iconUrl\":{\"data\":[\"https://leafletjs.com/examples/custom-icons/leaf-green.png\",\"https://leafletjs.com/examples/custom-icons/leaf-orange.png\",\"https://leafletjs.com/examples/custom-icons/leaf-red.png\"],\"index\":[0,0,0,0,0,0,0,0,0,0,1,1,1,1,1,1,1,1,1,1,2,2,2,2,2,2,2,2,2,2]},\"iconWidth\":38,\"iconHeight\":95,\"iconAnchorX\":22,\"iconAnchorY\":94,\"shadowUrl\":{\"data\":\"https://leafletjs.com/examples/custom-icons/leaf-shadow.png\",\"index\":0},\"shadowWidth\":50,\"shadowHeight\":64,\"shadowAnchorX\":4,\"shadowAnchorY\":62,\"popupAnchorX\":-3,\"popupAnchorY\":-76},null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[-1.300092441187019,3.452802853952099],\"lng\":[-2.761867517640907,6.94219937374031]}},\"evals\":[],\"jsHooks\":[]} # \\donttest{ # use point symbols from base R graphics as icons pchIcons <- function(pch = 0:14, width = 30, height = 30, ...) { n <- length(pch) files <- character(n) # create a sequence of png images for (i in seq_len(n)) { f <- tempfile(fileext = \".png\") png(f, width = width, height = height, bg = \"transparent\") par(mar = c(0, 0, 0, 0)) plot.new() points(.5, .5, pch = pch[i], cex = min(width, height) / 8, ...) dev.off() files[i] <- f } files } iconData <- matrix(rnorm(500), ncol = 2) res <- kmeans(iconData, 10) iconData <- cbind(iconData, res$cluster) colnames(iconData) <- c(\"lat\", \"lng\", \"group\") iconData <- as.data.frame(iconData) # 10 random point shapes for the 10 clusters in iconData shapes <- sample(0:14, 10) iconFiles <- pchIcons(shapes, 40, 40, col = \"steelblue\", lwd = 2) # note the data has 250 rows, and there are 10 icons in iconFiles; they are # connected by the `group` variable: the i-th row of iconData uses the # group[i]-th icon in the icon list leaflet() %>% addMarkers( data = iconData, icon = ~ icons( iconUrl = iconFiles[group], popupAnchorX = 20, popupAnchorY = 0 ), popup = ~ sprintf( \"lat = %.4f, long = %.4f, group = %s, pch = %s\", lat, lng, group, shapes[group] ) ) #> Assuming \"lng\" and \"lat\" are longitude and latitude, respectively {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addMarkers\",\"args\":[[-0.4202070943992731,-0.2553750856886408,-0.3692382165043028,1.212448329676568,-0.4453630059572704,1.138667521478022,0.1905234830273359,-1.366393612345354,-1.298102601156062,-2.137098311773513,-0.09620552500409683,0.694509054682261,-0.4745912300326947,1.763130611846386,2.025846063858513,0.4276188086072009,-0.5664793492680703,-0.8338353114637597,0.3982591545196686,-1.47453793146991,-0.3954412004778973,-0.1307024678757356,-1.999493949510331,-0.9959308611995511,0.420113997913957,-0.06286162873619033,-0.08013184849723405,-0.03228341380063453,-0.7189809251408055,-1.116561322532736,-0.7802699025770594,-1.776958528672158,-0.4278348742028892,-2.031027011868338,2.750764752946719,1.513669721154361,0.03398893691222062,0.7407927844096404,-1.270808180134421,-0.1635642319778462,-0.6109454886817877,1.251884191781531,0.2503194657810107,-1.705581680207421,-0.8554131291164022,-0.1449016306166019,-0.3244469582429402,-0.1725649016985262,-1.236062916981359,-1.902304205495255,-0.09450402398686145,0.03255578872739122,0.4612901151996156,1.381400302452626,-0.4164762738728929,0.680942672969972,-0.4143730436766691,-0.5183455097769446,-0.6840197309366717,-0.8856486012970711,0.04923706786969968,0.1855612151113114,-0.6086577894264535,-0.7311028526122243,2.71514421265171,-1.339387040662285,-0.6460152493506238,-0.9324546148031864,-0.7690869282990042,0.3715797827511594,0.3554327828373922,-0.9839984908792494,0.2147295936091625,-0.08008507989284833,-1.422369548746585,1.108148963267345,1.078477638307435,-0.4402503414117352,-0.7781690135619961,-1.818590012109126,-1.12408090423635,1.060523843269576,-1.478700159300311,-1.55156016912671,0.7775066752410458,1.068440137104656,-0.183587701267269,1.558242930972266,-0.2132423842855249,0.9305352643903654,0.4108117961114603,-1.279844297830575,-0.7823666282376297,-2.276083449854667,-0.126395908060913,1.448146706844424,-1.44275737195466,1.467187177035763,-0.7432999011069343,-0.3042238386711698,0.3376580626630231,-0.6075020854562057,-0.2955602703412146,-0.1345371403418327,0.814784366834976,-0.2729217327423396,2.159485796578484,1.091737569000391,0.7433848453491945,-1.207859353220848,0.3278180518891233,-0.5341651057110863,1.283946719283567,0.02893133997575183,-0.3956770690854846,-0.6948683269650554,-1.492080700679909,1.444257235021646,-0.3470173883840132,-0.040259166076385,1.246632110105347,-1.34630152351373,-0.5739012806856504,-0.7059592504796032,-1.857404540848706,-0.2469704806448306,-0.3355609286531535,-0.2493768703645628,0.4595225614486244,-0.46007548080678,0.0589327978627189,-0.7425910818095138,-2.16357400398328,-0.2328964923061294,0.8749068288242858,-0.9734940267500031,-0.5127468641517448,-0.9234879861287549,-1.494425725054262,-0.1659303604082342,1.582238320896474,1.01460226574204,-1.146478342645764,-0.9098491122193325,3.109182684890497,-1.069552774669116,-0.7001095183170118,-0.1984444695562153,0.7436201213265321,-0.05015976689187722,1.313143547213698,0.0860135151819091,-0.6298513723294854,0.6550703292747759,0.01939354926673886,0.6962699609727965,2.008869894731493,-0.05697828331221561,0.2404155043401251,-0.02189016526985176,-0.8308081599467646,1.402474316095725,-0.7238691096385832,1.330580365197691,-0.8113330188112591,1.795036105237782,0.6866263256237155,0.08937800129551228,0.3245477370933477,0.07131812468596369,0.2330483763187205,1.986376576914565,-0.9516707891689564,-0.5586423191880387,0.255814543086576,-0.1980761724650253,0.42878914377244,0.07077011138928845,-1.536653803527901,0.453984370212402,0.8743985675439103,-1.297737567551732,-1.078965236632913,-1.134849940880642,0.02261430747748914,-0.02146122477143903,-0.2787724429376735,-0.02420640614039543,0.8250203020616679,-0.7501827801623862,0.5362104656095469,-1.572717483416155,-0.9864274166591585,1.983512323214224,-1.851378443407981,-0.90978818261984,-1.951440016208645,-0.800276459006774,-1.869361598782836,-0.7505714831039624,-0.5909383854013818,-0.7420992691945617,0.6935120773005082,-0.05946397388741754,-1.863895098644565,-1.274508920390611,-1.781770808398643,-0.5085933893902366,-1.736878286348532,0.04048130345676831,-0.1241794576189968,-0.6127534316899452,0.1606624773969968,-0.6623596320048787,-0.3348516612822843,0.623011585590571,1.028194292444729,-1.134578240310851,0.9169110537572549,1.213874789465611,-0.6859324569719246,-1.09456819339406,0.3648740994660924,-1.008017083210849,0.554996435935428,0.4360659210415374,0.1053732960724887,-0.2537378525819919,-0.9764912318834779,0.394217765983834,1.014903026166746,0.6314438101839203,-0.4833982549352546,-1.526333935666461,0.6168422808601588,1.229286839432942,0.1574530268877342,1.406342055763919,0.3968009171671477,0.32642296416127,-1.459343308476307,-0.7992955273550889,0.4700127959384029,-1.150180520382904,-0.2715967161573364,0.4574242198601326,-0.01695793567169252,-0.5415943604330673,0.8758134174562739,0.7408381548831572],[-0.1648123878749513,-0.7509642835472464,-1.253366291254112,-1.036236261086891,-0.02943856918294788,-0.2749437779431586,0.4854514697156954,0.9169820339257299,-0.9853439162645946,-1.49118974621714,0.8195924493300755,1.01340453316793,1.053605251243667,-0.07142863879664518,0.9524446066581037,-0.3840375188814126,-0.4177599918285912,-0.4702681712570727,-1.690180287194481,-0.9454976554580454,-0.3430119602929844,0.3584624080565848,0.04818886066246819,1.130172278250215,-0.5276323115795134,0.4795753251263228,1.417529297958747,-0.08009077262193659,-0.3941870030211085,0.5252576367540488,-0.7959350962245446,0.2450964484123524,-0.7793198352531773,0.5949238709436765,1.108890896416993,-0.9429690299132897,0.7003439889195451,-0.4246748252127485,-1.143137602694829,0.233440224092367,-0.1892365768374837,-1.66341125636827,1.915690769851676,-0.8168944359495347,0.3836504926939145,-0.45863225105032,-0.7157039776060217,0.4295485413107256,-1.169852744557196,1.322088308621181,1.365964636230403,-0.2497237099230604,-0.4247213495822969,1.098439335187043,0.6709230408668556,0.03095465563428614,2.368511961367508,2.585788113093646,1.212280954550787,-1.251196840860951,0.4002660421968137,0.9347076305183237,-0.4726698458952756,1.58301322112178,0.5977542203255402,0.4660845862526154,-0.7443675373426283,0.9590552584880708,0.1526370807093095,-0.7693686970890065,1.393080738536693,0.918668765596698,1.0160870641131,0.5346354389649385,-0.9876285601047141,1.187792273294136,-0.5175422120592618,-0.2595602505958536,-0.3280646712350382,0.07343239495574358,-0.2478630202060162,-1.373862256098897,-0.04044581831363935,0.4215382385430456,0.2015975056017167,-1.697191918162991,0.6422876828900983,-0.9952396132262208,0.9638138998830267,-1.656037230871793,1.070861091480068,-0.1090263600463561,1.899186392722483,-1.137030733156864,-0.2797197578581568,-0.8941290505145657,0.1367018463153619,-0.7491654182242808,0.5181990767190288,-0.1923372142776934,0.0288098118017779,0.3585908856542522,-0.02899503456363366,1.147042072108809,0.3735889351047901,0.3233392112620057,-0.8298193202578782,1.394462581630908,-0.1915435771199435,0.2722770208617893,-1.081659008331326,-2.329399361363491,-0.5496259585570886,-0.0725799910031537,1.032288403733848,0.2151385257755671,-0.4943401245609158,1.512138281237257,-0.5794632641967767,1.674789633932644,-1.000980258524317,1.222702835218574,1.077188166080205,-0.6119454595294147,0.5068669683158991,0.4600683731220483,1.484391861458237,0.8819632260015384,-0.536702239350799,1.285553706509819,0.5878485326010617,-1.308482025518096,0.3167263248660296,1.194158303479843,0.9130571477944758,-0.786752992705507,-0.4109296996639918,0.4763736818416209,0.1859158675343828,-1.324716252975642,1.172371055125703,0.2314927722196306,0.4830719040714007,-0.5353195801955016,1.378135818972899,-1.302671671133523,0.6348575352934486,0.999655161250627,-0.3377489528256253,-0.08603360695374181,-1.718817583541451,-0.9291215723686332,0.8136760464960741,0.5264135456514646,1.011957390306609,0.8313798093443211,0.4151341447442909,-0.6612570608614495,0.5488112862802258,-0.5393677996350521,-0.1713184263702447,-0.766734605198929,-0.6065748455734394,1.64731282099364,0.8410693480785594,0.3381750972076064,-0.4048830757878161,0.9000090391443738,1.190666655241071,-0.04753908348423741,0.7869254247733276,1.166684112027711,-0.2718238713074823,-0.3137042849541035,-0.2863001501725999,-0.8034402628479541,-0.09455545529700358,-0.07404650616222856,0.7144906833898889,0.1247183657796416,1.296594338574938,-1.114492926037875,-0.8420588125144853,-1.504294208616326,-0.2840264551541388,0.04286904062378677,-0.008866413309984113,-2.949083784243553,0.02035825417575629,-0.09844697973347524,0.5891090977773195,-0.4257516288164602,0.634658985040875,-0.5785249022565833,-0.1691090479499068,-1.919232520195261,-1.534266386749387,-1.114761220951407,1.597811635315441,-0.6398050777154926,1.566690552631183,-1.449155712077402,-0.7915039586793183,-0.5044807329516383,0.4018267000623483,0.9713964685044942,-0.5796630201036562,1.60417978930849,0.2259733369959407,-0.5148571224052696,-0.8237882396380964,0.3344152498049095,-0.09349076450912039,0.3040620777065443,-0.476507533940173,-0.2413117171135555,0.8241558332894772,-1.555643970107624,0.09350128252654108,-0.3669494208501755,-0.1294087988556329,0.4077955203576215,-0.5839689536605007,-0.1934498897529203,-0.2695466695119815,0.07365823227732218,0.3572361375113718,0.5504284181905409,0.03840179346679532,-1.609575292012264,-1.049710114737772,2.0520339736577,0.1764364108433968,1.128307358107953,0.4350017438552748,0.5488334919145959,0.6474183037667887,0.8784634543623231,0.3507978687500333,0.04987972017287776,0.8357494456177605,-0.2817251988510062,-0.7916794609883141,0.001653727262336547,-1.187530126465644,0.3624174650393404,-0.5494353187990336,0.6929498383017207,-0.06084391642852865,-1.193540929994318],{\"iconUrl\":{\"data\":[\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAABOFBMVEUAAAAA//9/f39VqqpAf78zmcxVf6pJkrY5jqpGi7lOibFEiLtLh7RDhq5Af7JGf7lHhbhJf7ZKhLVJg7ZDf7VEg7RJf7ZEgrVEgrZIgrJIgrNGhLRHgrRGhLVEgbNHg7REgbRGgbNFg7RGg7JFgbNGgbNGgrRFgbRGgrRGgbRGgrRFg7VHgrNGg7RGgrVGgrRGg7VFgrNGgrVGg7VGgbNGgrNHgrVGgbNGgrNGgbRFgrRHgbNHgrNGg7RGgrRHg7RGgrRGgrRHgrRGgrRHgrRGgrVHgrRGgrNGgbRGgbRFgrVHgrNGgrRFgrRGgrRGgrRGgrRGgrRGgrRGgrRFgrRGgrRGgrRGgrNHgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgbRGgrQoxujkAAAAaHRSTlMAAQIDBAUGBwkLDQ8RExQWGRwfIyYpKi0xNTk6PT5DREdNTlBRV1hZYmNqa2xtbnR1dnh/gIOJipGSk5SbnJ2mp7Cxsri5vL3BxcrO0tXW2drb3N3g4+bp6+zt7vDy9Pb4+fr7/P3+/8TEAfUAAAE4SURBVDiNY2AYBdQBwvJEACGgwsB0IkAgUKFRuikh80zTjYAK2QJ8WfA7jtknmB1Eq6Rr4Veona4MYbhG8eJTxxPhDmWJJVvgU2iZIg5jWieL41YnmmSFMDzSDbdCl2g+BEc3XRGXOqV0HSQei08QO3Z1bP5+rMh8uXQD7AoN0xVQBZxiBbCp449xRBMRTrDFptAuUQRdyDxVElOdRKoZhhhXmCcjhqBHODembs10NXQh9XQNLM5h8grlRBXhCPFmwqKQQSrNGFXAJE0GmzoGBod4IWSuYJw9dnXoMmj6UOxKl0VwpNFdggSQXY/pN2SghggPzXRV3OqQQhhr+CMBeJxhjVFkYAtJBcIJNvjVAdOVE4hyxp7qkIEBKKXKpesTUgdO+7hzBjJQStfVw53XkIFrVJQrpigAEpRA4e+Am0MAAAAASUVORK5CYII=\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAAKlBMVEUAAABVqqpAf79Hg7RGgrRGgrVGg7RGgrVHgbNGgbRFg7NGg7RFgrRGgrQeLgjrAAAADnRSTlMAAwRzdHh7fJSWoqSp/66qNFgAAACpSURBVDiNjdXZDgMhCAVQ7GA7S/n/3+2krVGBC/pITuICuRKZVfa92KrjLpFrQZZTnpu8HyuOKJc/l8vmMtldLEcXydlhqR2S1vnSc570nZXIaYndLCM3yth1mbkmc/eXh9TMEVU51uG99Stz3A6ZSO7XDiWPDxlInlsDJetmA8l2fFypHZLW+dJznvSdlchpid0sIzfK2HWZuSZz943wWtdCfDHs0ffxAdN1CQ17hm83AAAAAElFTkSuQmCC\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAAD1BMVEUAAABHgrRGgrRFgbRGgrQ7ZCpoAAAABXRSTlMAfru/7qRvvecAAAAySURBVDiNY2DABIyMWASxAWbmUYWjCoeNQkYmDMDCginGSLzCAfTMqMJRhQOjEGv1AQDUpAGBsJNc7gAAAABJRU5ErkJggg==\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAABDlBMVEUAAAAA//9/f39VqqpAf79Av78zmcxKf7VHhbhFf7FChLNJf7ZGhLBEf7JKhLVIf7dGg7JDf7RJg7ZHf7FJf7ZEgrVGgrRGg7VGgbNHgrNFgrVHgbNGgbRFgrVHgbNGgrRFg7VHgrNHg7RGgrRGg7VFgrNHg7RGgrNGgbRHgrRGgbVGgrNFgbRFg7ZHgrVGgbNFgbRGgrRGhLZGgrRGg7RGg7RGgrRHgrRGg7RGgrRGgrRHgrRGgrVGgrRGgrRGgbRGgrRHgbRGgrRGgbRGgrRFgbNFgbVGgrRFgrVGgbRGgrRGg7RFgrNHgrVGgbRFgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgbRGgrQa4aLEAAAAWnRSTlMAAQIDBAQFGBkaGxwdHh8gISIjJCotM0xNXmBhY2RlZmdoc3R1dneDhIWGh4iIiYqMj4+Zmpydn6C1t7i5urvBwsPExcbHx8jKy8zNzs7P0vT19vf4+/z9/v/aZ5NYAAABmklEQVQ4jd3U6V6CQBAA8DE6BLHUEo/MTC1TSaXS0k7tELVL1I15/xcJRXEW7AXcT8vs/8cyw+4ArN84WE4FUVFEYeUSQBQ1exI5fflFa7BOPmxHNIxSqc2kfMNMvZCOxdKFnskaAWeBjDJqvtTIUKVFQKoYxiGobjeVH9gM0IjcQt3rAHT82uIjwjsOvC6JXWt3LqRam6TdTh41hTIvre8T7oeSC94asp0RdVZKRp13+0y1M3LkPN8qC3PwzLQTduSiLpKZ4+Brdz6Zy2X9em3qBFYAKkmdixPy30HCIyDygtQ5g34CFYwBkXi5fIqj8h9UkVaJhyIeE6fRep7gDk1mck4cV88Slwx0dOqoHDxRB3lTom4pZTPLwQircM6RNRbiIDRGQeDP80zuja94BwGjJbjOvSW3H35EF4SE99yX8RNTbje9Ct+bfER4w77P41Qc4F2QRnYfvbfDziM5HFXlRUCujYcJKLulfc+lOjP7xUw8nin1TXYtgqcBOC0lnGtPpi1l8pwNLV7BtRTSiTb8iuLfWLm0NuMPVEVPYc1PKswAAAAASUVORK5CYII=\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAAHlBMVEUAAAAA//9Jf7ZEgrVGgrNFgbRFg7ZGgrRGhLZGgrQ9CRVYAAAACnRSTlMAASoth4iIj4//c7lcugAAAIJJREFUOI3d1N0OgCAIBWDLinj/F+5nzakH8Fw2uXN80w2QlOaLlUxlFc+J5vboSEhsKovhdrzAlIYzpekM6TiQrutk4BoZukoOXJFD90nCvfJg3CP1ZNz9rt13dOJMCDh3lsARstRlIKv6hbKpcyC7frgS+vazf8QuAH6lsEtqkrgAjVQEigFnHRgAAAAASUVORK5CYII=\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAAS1BMVEUAAAB/f39IgrJHhLNGhLRIg7NLhbRHg7RHhLVGgbNHgrJIg7JFg7VHg7RHhLNHg7RHgrRHgbRGgrRGgrRFgrRGgrRFg7NHg7RGgrQCPHREAAAAGXRSTlMAAjU2OkBBRFNXWmNnc3Z3gYTS1NXd4PT/O546hwAAANFJREFUOI3d1OsSgiAQhmHJJLVM7eTe/5Um4MICH/q7dmyGrXeesmaqqv+b80VM28rtJLuadqYWYUNDIGaiOWwDNVEYNvVcR8GX4q2jbr2OQ/V4KfM4DK0myFLoMEGWws0KZCFkKpCF0Ev+gMMA+RMOxd3yEYby++MzDOUvwgsKJeg3FEYgryCMQd5BmIDbE3mYghuZhxnoyCzMQUdmIQAtmYYagJbUSTgh0JBTEr4RaMhPEmLQkFGoaRnvcMaFtAj7vb+UXr7DDXtmrvgz/fR8AaEAGHnJp2rcAAAAAElFTkSuQmCC\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAANlBMVEUAAAAA//9Ig7NHhbRHg7RKgrVFhLRHgrVGgrNFgbRFg7ZGgrRGhLZGg7NFgbRGgrRFgrRGgrRkfGsyAAAAEnRSTlMAAUBBRFZZWoeIiI+Ppaarrf9+YQ6pAAAAs0lEQVQ4jd3USQ7DIAwFUEratCQd4vtftswY8x2xjneIJ2R/CRtzvXre1Xpwt9JJrQxaogO/dxDZDn5ov4GWHP0EtC8kHe1WQgOkd2aEowwOQSmjg7CXyWHIZXYKbLI4DRZZnQqTbE6HQW7NnUAv6a1c9SdHPCUd+v54niqMczCpwTxvkwqsuVSJIcuvSAiZqxLBzhUJoHBZjnBwSQ4QuCgXAb/IBSm/6+QCmF4p00vqIvUHa9QQ+5CCZJ4AAAAASUVORK5CYII=\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAABcVBMVEUAAAAA//9/f39VqqpAf78zmcxVf6pJkrZAf785jqpGi7lOibFEiLtLh7RHf7hDhq5Af7JGf7lHhbhJf7ZKhLVJg7ZDf7VEg7RJf7ZGf7RIf7FEgrZFhLVIgrJIgrNGhLRHgrRGhLVGg7ZEgbNHg7REgbRHg7VGg7VGgbNFg7RHgbVFgbNIg7RGgbNGgrRFgbRHgbNGgrRGgbRFgrVGg7RGgrRHgrNGg7RGgrVGgrRGg7VFgrNGgrVHgrRGg7VGgbNGgrNFgbRHgrVGgbNGgrRHgbVGgrNHgbNGgrRHgrNGg7RGgrRGgrNHg7RGgrRGg7VGgrRHgrRGgrRGgrRGgrVHgrRGgrNGgbRGgrRGgbRGgrRFgrVHgrNGg7VGgrRGg7RFgrRGgrRGgrRGgrRGgrRGgrRFgrRGgrRGgrRGgrRGgrNHgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgrRGgbRGgrSTYk+GAAAAe3RSTlMAAQIDBAUGBwgJCw0PERITFBYZHB8jJikqLC4xNDU5Oj0+QkNER0hMTU5PUVJXWFlhYmNkaWpsbW50dXZ4fn+Ag4iJiouQkZSVm5ydpaanqLCxsre5vL3BwsXGys7R0tPV1tna3N3g4+bo6evs7e7w8vT2+Pn6+/z9/v/BB7PWAAABUUlEQVQ4je2S51bCQBCFR5oFLIixYe8VuyiiYFesKPaGxIIlIqIQ5uklJ0QCm93wAN4/c+futzmTPQNAKCQIITIlNYSzbhzU5yyRsNl4+1CqCy5gL0AXevQ4e+xQKsHPWh1w57teKlwiwOac4rJsVsRWJnj+YpONNXpZwuDGcFyxE+iic+VP1wbFG66eK6igL92Ra9rSPhrniO+q272vOgp4kH/iiO9rc+3pxfxgCTu1OHJ69b+pNIWjhZELJ0nOGr0gX/js1UZka2ILeduZWi2MuMS2xjgQkHdEpSPtvbLHgvlBN85rcQAe7FO3pjva7lsi92ZVO4f92hzAALpzTdX7CY0DOP6o+fNbySY62PCzqdjG5DqdA9hINWddSKhmgZVvp7IZwWkWBzCDw1Kx8GETGzTePJZlihf9PTryozcD8liE+AzI6X1PEsce7l9F6xcGdk1VTEk5tgAAAABJRU5ErkJggg==\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAALVBMVEUAAABIgrJHhLNGhLRIg7NHg7RGg7ZHhLVHg7RGgrRFgbRGgrRGgrRGgrRGgrRShW4XAAAAD3RSTlMANTY6QERQU3O7v8zQ7v/aRe04AAAAV0lEQVQ4je2UOQ7AIBDECBBu5v/PpcykgKyoCMKdhbUSzSi1H+YmvGe7uNMYoCm0CHSjFJIA+wrZUuo+nXDV0CHHh1pJMtxM+Idfn/AjFA6AeFLEI7UJDdPEDV1c7JwyAAAAAElFTkSuQmCC\",\"data:image/png;base64,iVBORw0KGgoAAAANSUhEUgAAACgAAAAoCAMAAAC7IEhfAAAAPFBMVEUAAABVqqpAf79Hg7RGgrRGg7RGgrVFg7NGg7RFgrRGgrRFgbRHgbNFgbVGgbRHgrRGgbRGgrRGgrRGgrSIq6AnAAAAFHRSTlMAAwRzdHt8oqSpu7/Jytvc3d7u/yk3gSAAAADVSURBVDiNjdVZEsIgDABQqohVulnuf1db1iwEyGfmzQRIJijFYlqWiWcrbnZuHpDT2/1293kMuJe1z668nbJW9aR3N+zI4DxsyugCbMjkIhRldgkKsrgMqxK4AisSOgCZRA5CIrFDEEniMASSOgKzZI7CKLljMMjVbV8S50kzm1vH4VXa9ErrdEjThrpc27Sghg9pZKhxa4wENW22qUPNx8fUIHVYFsgdkhnWHJQJ1h2QEUquyABll6WHLZfkDdsuygv2XJDW9p1f4ccxtsQHl730ffwBkkAP1sgtFMQAAAAASUVORK5CYII=\"],\"index\":[0,0,0,1,0,2,3,4,5,5,3,6,3,7,7,2,0,8,1,5,0,3,4,4,2,3,9,0,8,4,0,4,0,4,7,1,3,2,5,3,8,1,9,5,8,0,0,3,5,4,9,0,2,6,3,2,9,9,9,5,3,3,0,9,7,4,0,4,8,0,6,4,3,3,5,6,1,0,8,4,8,1,8,4,2,1,3,1,3,1,6,8,9,5,0,1,8,1,3,0,2,3,0,3,2,3,1,6,2,8,0,5,1,2,3,8,8,6,0,9,1,4,3,0,4,3,9,3,2,9,3,5,4,9,6,5,0,4,4,0,6,2,4,8,7,5,3,3,2,0,1,0,3,2,3,6,7,0,3,0,8,1,0,6,3,7,2,3,6,2,3,7,8,0,2,0,2,2,4,2,6,5,5,5,0,2,0,5,2,8,2,8,4,1,8,5,5,5,4,0,9,5,1,0,4,4,8,9,4,0,0,3,2,3,0,2,6,5,2,1,8,4,2,8,2,2,3,3,8,1,1,6,3,4,2,6,3,6,2,2,4,8,2,8,0,2,0,3,2,1]},\"popupAnchorX\":20,\"popupAnchorY\":0},null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},[\"lat = -0.4202, long = -0.1648, group = 4, pch = 6\",\"lat = -0.2554, long = -0.7510, group = 4, pch = 6\",\"lat = -0.3692, long = -1.2534, group = 4, pch = 6\",\"lat = 1.2124, long = -1.0362, group = 9, pch = 5\",\"lat = -0.4454, long = -0.0294, group = 4, pch = 6\",\"lat = 1.1387, long = -0.2749, group = 2, pch = 3\",\"lat = 0.1905, long = 0.4855, group = 8, pch = 13\",\"lat = -1.3664, long = 0.9170, group = 1, pch = 4\",\"lat = -1.2981, long = -0.9853, group = 5, pch = 14\",\"lat = -2.1371, long = -1.4912, group = 5, pch = 14\",\"lat = -0.0962, long = 0.8196, group = 8, pch = 13\",\"lat = 0.6945, long = 1.0134, group = 3, pch = 7\",\"lat = -0.4746, long = 1.0536, group = 8, pch = 13\",\"lat = 1.7631, long = -0.0714, group = 7, pch = 2\",\"lat = 2.0258, long = 0.9524, group = 7, pch = 2\",\"lat = 0.4276, long = -0.3840, group = 2, pch = 3\",\"lat = -0.5665, long = -0.4178, group = 4, pch = 6\",\"lat = -0.8338, long = -0.4703, group = 10, pch = 12\",\"lat = 0.3983, long = -1.6902, group = 9, pch = 5\",\"lat = -1.4745, long = -0.9455, group = 5, pch = 14\",\"lat = -0.3954, long = -0.3430, group = 4, pch = 6\",\"lat = -0.1307, long = 0.3585, group = 8, pch = 13\",\"lat = -1.9995, long = 0.0482, group = 1, pch = 4\",\"lat = -0.9959, long = 1.1302, group = 1, pch = 4\",\"lat = 0.4201, long = -0.5276, group = 2, pch = 3\",\"lat = -0.0629, long = 0.4796, group = 8, pch = 13\",\"lat = -0.0801, long = 1.4175, group = 6, pch = 9\",\"lat = -0.0323, long = -0.0801, group = 4, pch = 6\",\"lat = -0.7190, long = -0.3942, group = 10, pch = 12\",\"lat = -1.1166, long = 0.5253, group = 1, pch = 4\",\"lat = -0.7803, long = -0.7959, group = 4, pch = 6\",\"lat = -1.7770, long = 0.2451, group = 1, pch = 4\",\"lat = -0.4278, long = -0.7793, group = 4, pch = 6\",\"lat = -2.0310, long = 0.5949, group = 1, pch = 4\",\"lat = 2.7508, long = 1.1089, group = 7, pch = 2\",\"lat = 1.5137, long = -0.9430, group = 9, pch = 5\",\"lat = 0.0340, long = 0.7003, group = 8, pch = 13\",\"lat = 0.7408, long = -0.4247, group = 2, pch = 3\",\"lat = -1.2708, long = -1.1431, group = 5, pch = 14\",\"lat = -0.1636, long = 0.2334, group = 8, pch = 13\",\"lat = -0.6109, long = -0.1892, group = 10, pch = 12\",\"lat = 1.2519, long = -1.6634, group = 9, pch = 5\",\"lat = 0.2503, long = 1.9157, group = 6, pch = 9\",\"lat = -1.7056, long = -0.8169, group = 5, pch = 14\",\"lat = -0.8554, long = 0.3837, group = 10, pch = 12\",\"lat = -0.1449, long = -0.4586, group = 4, pch = 6\",\"lat = -0.3244, long = -0.7157, group = 4, pch = 6\",\"lat = -0.1726, long = 0.4295, group = 8, pch = 13\",\"lat = -1.2361, long = -1.1699, group = 5, pch = 14\",\"lat = -1.9023, long = 1.3221, group = 1, pch = 4\",\"lat = -0.0945, long = 1.3660, group = 6, pch = 9\",\"lat = 0.0326, long = -0.2497, group = 4, pch = 6\",\"lat = 0.4613, long = -0.4247, group = 2, pch = 3\",\"lat = 1.3814, long = 1.0984, group = 3, pch = 7\",\"lat = -0.4165, long = 0.6709, group = 8, pch = 13\",\"lat = 0.6809, long = 0.0310, group = 2, pch = 3\",\"lat = -0.4144, long = 2.3685, group = 6, pch = 9\",\"lat = -0.5183, long = 2.5858, group = 6, pch = 9\",\"lat = -0.6840, long = 1.2123, group = 6, pch = 9\",\"lat = -0.8856, long = -1.2512, group = 5, pch = 14\",\"lat = 0.0492, long = 0.4003, group = 8, pch = 13\",\"lat = 0.1856, long = 0.9347, group = 8, pch = 13\",\"lat = -0.6087, long = -0.4727, group = 4, pch = 6\",\"lat = -0.7311, long = 1.5830, group = 6, pch = 9\",\"lat = 2.7151, long = 0.5978, group = 7, pch = 2\",\"lat = -1.3394, long = 0.4661, group = 1, pch = 4\",\"lat = -0.6460, long = -0.7444, group = 4, pch = 6\",\"lat = -0.9325, long = 0.9591, group = 1, pch = 4\",\"lat = -0.7691, long = 0.1526, group = 10, pch = 12\",\"lat = 0.3716, long = -0.7694, group = 4, pch = 6\",\"lat = 0.3554, long = 1.3931, group = 3, pch = 7\",\"lat = -0.9840, long = 0.9187, group = 1, pch = 4\",\"lat = 0.2147, long = 1.0161, group = 8, pch = 13\",\"lat = -0.0801, long = 0.5346, group = 8, pch = 13\",\"lat = -1.4224, long = -0.9876, group = 5, pch = 14\",\"lat = 1.1081, long = 1.1878, group = 3, pch = 7\",\"lat = 1.0785, long = -0.5175, group = 9, pch = 5\",\"lat = -0.4403, long = -0.2596, group = 4, pch = 6\",\"lat = -0.7782, long = -0.3281, group = 10, pch = 12\",\"lat = -1.8186, long = 0.0734, group = 1, pch = 4\",\"lat = -1.1241, long = -0.2479, group = 10, pch = 12\",\"lat = 1.0605, long = -1.3739, group = 9, pch = 5\",\"lat = -1.4787, long = -0.0404, group = 10, pch = 12\",\"lat = -1.5516, long = 0.4215, group = 1, pch = 4\",\"lat = 0.7775, long = 0.2016, group = 2, pch = 3\",\"lat = 1.0684, long = -1.6972, group = 9, pch = 5\",\"lat = -0.1836, long = 0.6423, group = 8, pch = 13\",\"lat = 1.5582, long = -0.9952, group = 9, pch = 5\",\"lat = -0.2132, long = 0.9638, group = 8, pch = 13\",\"lat = 0.9305, long = -1.6560, group = 9, pch = 5\",\"lat = 0.4108, long = 1.0709, group = 3, pch = 7\",\"lat = -1.2798, long = -0.1090, group = 10, pch = 12\",\"lat = -0.7824, long = 1.8992, group = 6, pch = 9\",\"lat = -2.2761, long = -1.1370, group = 5, pch = 14\",\"lat = -0.1264, long = -0.2797, group = 4, pch = 6\",\"lat = 1.4481, long = -0.8941, group = 9, pch = 5\",\"lat = -1.4428, long = 0.1367, group = 10, pch = 12\",\"lat = 1.4672, long = -0.7492, group = 9, pch = 5\",\"lat = -0.7433, long = 0.5182, group = 8, pch = 13\",\"lat = -0.3042, long = -0.1923, group = 4, pch = 6\",\"lat = 0.3377, long = 0.0288, group = 2, pch = 3\",\"lat = -0.6075, long = 0.3586, group = 8, pch = 13\",\"lat = -0.2956, long = -0.0290, group = 4, pch = 6\",\"lat = -0.1345, long = 1.1470, group = 8, pch = 13\",\"lat = 0.8148, long = 0.3736, group = 2, pch = 3\",\"lat = -0.2729, long = 0.3233, group = 8, pch = 13\",\"lat = 2.1595, long = -0.8298, group = 9, pch = 5\",\"lat = 1.0917, long = 1.3945, group = 3, pch = 7\",\"lat = 0.7434, long = -0.1915, group = 2, pch = 3\",\"lat = -1.2079, long = 0.2723, group = 10, pch = 12\",\"lat = 0.3278, long = -1.0817, group = 4, pch = 6\",\"lat = -0.5342, long = -2.3294, group = 5, pch = 14\",\"lat = 1.2839, long = -0.5496, group = 9, pch = 5\",\"lat = 0.0289, long = -0.0726, group = 2, pch = 3\",\"lat = -0.3957, long = 1.0323, group = 8, pch = 13\",\"lat = -0.6949, long = 0.2151, group = 10, pch = 12\",\"lat = -1.4921, long = -0.4943, group = 10, pch = 12\",\"lat = 1.4443, long = 1.5121, group = 3, pch = 7\",\"lat = -0.3470, long = -0.5795, group = 4, pch = 6\",\"lat = -0.0403, long = 1.6748, group = 6, pch = 9\",\"lat = 1.2466, long = -1.0010, group = 9, pch = 5\",\"lat = -1.3463, long = 1.2227, group = 1, pch = 4\",\"lat = -0.5739, long = 1.0772, group = 8, pch = 13\",\"lat = -0.7060, long = -0.6119, group = 4, pch = 6\",\"lat = -1.8574, long = 0.5069, group = 1, pch = 4\",\"lat = -0.2470, long = 0.4601, group = 8, pch = 13\",\"lat = -0.3356, long = 1.4844, group = 6, pch = 9\",\"lat = -0.2494, long = 0.8820, group = 8, pch = 13\",\"lat = 0.4595, long = -0.5367, group = 2, pch = 3\",\"lat = -0.4601, long = 1.2856, group = 6, pch = 9\",\"lat = 0.0589, long = 0.5878, group = 8, pch = 13\",\"lat = -0.7426, long = -1.3085, group = 5, pch = 14\",\"lat = -2.1636, long = 0.3167, group = 1, pch = 4\",\"lat = -0.2329, long = 1.1942, group = 6, pch = 9\",\"lat = 0.8749, long = 0.9131, group = 3, pch = 7\",\"lat = -0.9735, long = -0.7868, group = 5, pch = 14\",\"lat = -0.5127, long = -0.4109, group = 4, pch = 6\",\"lat = -0.9235, long = 0.4764, group = 1, pch = 4\",\"lat = -1.4944, long = 0.1859, group = 1, pch = 4\",\"lat = -0.1659, long = -1.3247, group = 4, pch = 6\",\"lat = 1.5822, long = 1.1724, group = 3, pch = 7\",\"lat = 1.0146, long = 0.2315, group = 2, pch = 3\",\"lat = -1.1465, long = 0.4831, group = 1, pch = 4\",\"lat = -0.9098, long = -0.5353, group = 10, pch = 12\",\"lat = 3.1092, long = 1.3781, group = 7, pch = 2\",\"lat = -1.0696, long = -1.3027, group = 5, pch = 14\",\"lat = -0.7001, long = 0.6349, group = 8, pch = 13\",\"lat = -0.1984, long = 0.9997, group = 8, pch = 13\",\"lat = 0.7436, long = -0.3377, group = 2, pch = 3\",\"lat = -0.0502, long = -0.0860, group = 4, pch = 6\",\"lat = 1.3131, long = -1.7188, group = 9, pch = 5\",\"lat = 0.0860, long = -0.9291, group = 4, pch = 6\",\"lat = -0.6299, long = 0.8137, group = 8, pch = 13\",\"lat = 0.6551, long = 0.5264, group = 2, pch = 3\",\"lat = 0.0194, long = 1.0120, group = 8, pch = 13\",\"lat = 0.6963, long = 0.8314, group = 3, pch = 7\",\"lat = 2.0089, long = 0.4151, group = 7, pch = 2\",\"lat = -0.0570, long = -0.6613, group = 4, pch = 6\",\"lat = 0.2404, long = 0.5488, group = 8, pch = 13\",\"lat = -0.0219, long = -0.5394, group = 4, pch = 6\",\"lat = -0.8308, long = -0.1713, group = 10, pch = 12\",\"lat = 1.4025, long = -0.7667, group = 9, pch = 5\",\"lat = -0.7239, long = -0.6066, group = 4, pch = 6\",\"lat = 1.3306, long = 1.6473, group = 3, pch = 7\",\"lat = -0.8113, long = 0.8411, group = 8, pch = 13\",\"lat = 1.7950, long = 0.3382, group = 7, pch = 2\",\"lat = 0.6866, long = -0.4049, group = 2, pch = 3\",\"lat = 0.0894, long = 0.9000, group = 8, pch = 13\",\"lat = 0.3245, long = 1.1907, group = 3, pch = 7\",\"lat = 0.0713, long = -0.0475, group = 2, pch = 3\",\"lat = 0.2330, long = 0.7869, group = 8, pch = 13\",\"lat = 1.9864, long = 1.1667, group = 7, pch = 2\",\"lat = -0.9517, long = -0.2718, group = 10, pch = 12\",\"lat = -0.5586, long = -0.3137, group = 4, pch = 6\",\"lat = 0.2558, long = -0.2863, group = 2, pch = 3\",\"lat = -0.1981, long = -0.8034, group = 4, pch = 6\",\"lat = 0.4288, long = -0.0946, group = 2, pch = 3\",\"lat = 0.0708, long = -0.0740, group = 2, pch = 3\",\"lat = -1.5367, long = 0.7145, group = 1, pch = 4\",\"lat = 0.4540, long = 0.1247, group = 2, pch = 3\",\"lat = 0.8744, long = 1.2966, group = 3, pch = 7\",\"lat = -1.2977, long = -1.1145, group = 5, pch = 14\",\"lat = -1.0790, long = -0.8421, group = 5, pch = 14\",\"lat = -1.1348, long = -1.5043, group = 5, pch = 14\",\"lat = 0.0226, long = -0.2840, group = 4, pch = 6\",\"lat = -0.0215, long = 0.0429, group = 2, pch = 3\",\"lat = -0.2788, long = -0.0089, group = 4, pch = 6\",\"lat = -0.0242, long = -2.9491, group = 5, pch = 14\",\"lat = 0.8250, long = 0.0204, group = 2, pch = 3\",\"lat = -0.7502, long = -0.0984, group = 10, pch = 12\",\"lat = 0.5362, long = 0.5891, group = 2, pch = 3\",\"lat = -1.5727, long = -0.4258, group = 10, pch = 12\",\"lat = -0.9864, long = 0.6347, group = 1, pch = 4\",\"lat = 1.9835, long = -0.5785, group = 9, pch = 5\",\"lat = -1.8514, long = -0.1691, group = 10, pch = 12\",\"lat = -0.9098, long = -1.9192, group = 5, pch = 14\",\"lat = -1.9514, long = -1.5343, group = 5, pch = 14\",\"lat = -0.8003, long = -1.1148, group = 5, pch = 14\",\"lat = -1.8694, long = 1.5978, group = 1, pch = 4\",\"lat = -0.7506, long = -0.6398, group = 4, pch = 6\",\"lat = -0.5909, long = 1.5667, group = 6, pch = 9\",\"lat = -0.7421, long = -1.4492, group = 5, pch = 14\",\"lat = 0.6935, long = -0.7915, group = 9, pch = 5\",\"lat = -0.0595, long = -0.5045, group = 4, pch = 6\",\"lat = -1.8639, long = 0.4018, group = 1, pch = 4\",\"lat = -1.2745, long = 0.9714, group = 1, pch = 4\",\"lat = -1.7818, long = -0.5797, group = 10, pch = 12\",\"lat = -0.5086, long = 1.6042, group = 6, pch = 9\",\"lat = -1.7369, long = 0.2260, group = 1, pch = 4\",\"lat = 0.0405, long = -0.5149, group = 4, pch = 6\",\"lat = -0.1242, long = -0.8238, group = 4, pch = 6\",\"lat = -0.6128, long = 0.3344, group = 8, pch = 13\",\"lat = 0.1607, long = -0.0935, group = 2, pch = 3\",\"lat = -0.6624, long = 0.3041, group = 8, pch = 13\",\"lat = -0.3349, long = -0.4765, group = 4, pch = 6\",\"lat = 0.6230, long = -0.2413, group = 2, pch = 3\",\"lat = 1.0282, long = 0.8242, group = 3, pch = 7\",\"lat = -1.1346, long = -1.5556, group = 5, pch = 14\",\"lat = 0.9169, long = 0.0935, group = 2, pch = 3\",\"lat = 1.2139, long = -0.3669, group = 9, pch = 5\",\"lat = -0.6859, long = -0.1294, group = 10, pch = 12\",\"lat = -1.0946, long = 0.4078, group = 1, pch = 4\",\"lat = 0.3649, long = -0.5840, group = 2, pch = 3\",\"lat = -1.0080, long = -0.1934, group = 10, pch = 12\",\"lat = 0.5550, long = -0.2695, group = 2, pch = 3\",\"lat = 0.4361, long = 0.0737, group = 2, pch = 3\",\"lat = 0.1054, long = 0.3572, group = 8, pch = 13\",\"lat = -0.2537, long = 0.5504, group = 8, pch = 13\",\"lat = -0.9765, long = 0.0384, group = 10, pch = 12\",\"lat = 0.3942, long = -1.6096, group = 9, pch = 5\",\"lat = 1.0149, long = -1.0497, group = 9, pch = 5\",\"lat = 0.6314, long = 2.0520, group = 3, pch = 7\",\"lat = -0.4834, long = 0.1764, group = 8, pch = 13\",\"lat = -1.5263, long = 1.1283, group = 1, pch = 4\",\"lat = 0.6168, long = 0.4350, group = 2, pch = 3\",\"lat = 1.2293, long = 0.5488, group = 3, pch = 7\",\"lat = 0.1575, long = 0.6474, group = 8, pch = 13\",\"lat = 1.4063, long = 0.8785, group = 3, pch = 7\",\"lat = 0.3968, long = 0.3508, group = 2, pch = 3\",\"lat = 0.3264, long = 0.0499, group = 2, pch = 3\",\"lat = -1.4593, long = 0.8357, group = 1, pch = 4\",\"lat = -0.7993, long = -0.2817, group = 10, pch = 12\",\"lat = 0.4700, long = -0.7917, group = 2, pch = 3\",\"lat = -1.1502, long = 0.0017, group = 10, pch = 12\",\"lat = -0.2716, long = -1.1875, group = 4, pch = 6\",\"lat = 0.4574, long = 0.3624, group = 2, pch = 3\",\"lat = -0.0170, long = -0.5494, group = 4, pch = 6\",\"lat = -0.5416, long = 0.6929, group = 8, pch = 13\",\"lat = 0.8758, long = -0.0608, group = 2, pch = 3\",\"lat = 0.7408, long = -1.1935, group = 9, pch = 5\"],null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[-2.276083449854667,3.109182684890497],\"lng\":[-2.949083784243553,2.585788113093646]}},\"evals\":[],\"jsHooks\":[]} unlink(iconFiles) # clean up the tmp png files that have been embedded # }"},{"path":"https://rstudio.github.io/leaflet/reference/leaflet-package.html","id":null,"dir":"Reference","previous_headings":"","what":"leaflet: Create Interactive Web Maps with the JavaScript 'Leaflet' Library — leaflet-package","title":"leaflet: Create Interactive Web Maps with the JavaScript 'Leaflet' Library — leaflet-package","text":"Create customize interactive maps using 'Leaflet' JavaScript library 'htmlwidgets' package. maps can used directly R console, 'RStudio', Shiny applications R Markdown documents.","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/leaflet-package.html","id":"author","dir":"Reference","previous_headings":"","what":"Author","title":"leaflet: Create Interactive Web Maps with the JavaScript 'Leaflet' Library — leaflet-package","text":"Maintainer: Joe Cheng joe@posit.co Authors: Barret Schloerke barret@posit.co (ORCID) Bhaskar Karambelkar Yihui Xie contributors: Hadley Wickham [contributor] Kenton Russell [contributor] Kent Johnson [contributor] Vladimir Agafonkin (Leaflet library) [contributor, copyright holder] CloudMade (Leaflet library) [copyright holder] Leaflet contributors (Leaflet library) [contributor] Brandon Copeland (leaflet-measure plugin) [contributor, copyright holder] Joerg Dietrich (Leaflet.Terminator plugin) [contributor, copyright holder] Benjamin Becquet (Leaflet.MagnifyingGlass plugin) [contributor, copyright holder] Norkart (Leaflet.MiniMap plugin) [contributor, copyright holder] L. Voogdt (Leaflet.awesome-markers plugin) [contributor, copyright holder] Daniel Montague (Leaflet.EasyButton plugin) [contributor, copyright holder] Kartena AB (Proj4Leaflet plugin) [contributor, copyright holder] Robert Kajic (leaflet-locationfilter plugin) [contributor, copyright holder] Mapbox (leaflet-omnivore plugin) [contributor, copyright holder] Michael Bostock (topojson) [contributor, copyright holder] Posit Software, PBC [copyright holder, funder]","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":null,"dir":"Reference","previous_headings":"","what":"Create a Leaflet map widget — leaflet","title":"Create a Leaflet map widget — leaflet","text":"function creates Leaflet map widget using htmlwidgets. widget can rendered HTML pages generated R Markdown, Shiny, applications.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Create a Leaflet map widget — leaflet","text":"","code":"leaflet( data = NULL, width = NULL, height = NULL, padding = 0, options = leafletOptions(), elementId = NULL, sizingPolicy = leafletSizingPolicy(padding = padding) ) leafletOptions( minZoom = NULL, maxZoom = NULL, crs = leafletCRS(), worldCopyJump = NULL, preferCanvas = NULL, ... ) leafletCRS( crsClass = \"L.CRS.EPSG3857\", code = NULL, proj4def = NULL, projectedBounds = NULL, origin = NULL, transformation = NULL, scales = NULL, resolutions = NULL, bounds = NULL, tileSize = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Create a Leaflet map widget — leaflet","text":"data data object. Currently supported objects matrix, data frame, spatial data sf package, SpatVector terra package, Spatial* objects sp package represent points, lines, polygons. width width map height height map padding padding map options map options elementId Use explicit element ID widget (rather automatically generated one). sizingPolicy htmlwidgets sizing policy object. Defaults leafletSizingPolicy() minZoom Minimum zoom level map. Overrides minZoom set map layers. maxZoom Maximum zoom level map. overrides maxZoom set map layers. crs Coordinate Reference System use. change sure means. worldCopyJump option enabled, map tracks pan another \"copy\" world seamlessly jumps original one overlays like markers vector layers still visible. preferCanvas Whether leaflet.js Paths rendered Canvas renderer. ... options used leaflet.js map creation. crsClass One L.CRS.EPSG3857, L.CRS.EPSG4326, L.CRS.EPSG3395, L.CRS.Simple, L.Proj.CRS code CRS identifier proj4def Proj4 string projectedBounds DEPRECATED! Use bounds argument. origin Origin projected coordinates, set overrides transformation option. transformation use transforming projected coordinates pixel coordinates scales Scale factors (pixels per projection unit, example pixels/meter) zoom levels; specify either scales resolutions, resolutions factors (projection units per pixel, example meters/pixel) zoom levels; specify either scales resolutions, bounds Bounds CRS, projected coordinates; defined, Proj4Leaflet use getSize method, otherwise defaulting Leaflet's default CRS size tileSize DEPRECATED! Specify tilesize tileOptions() argument.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Create a Leaflet map widget — leaflet","text":"HTML widget object, can add graphics layers using %>% (see examples).","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Create a Leaflet map widget — leaflet","text":"data argument needed going reference variables object later map layers. example, data can data frame containing columns latitude longtitude, may add circle layer map leaflet(data) %>% addCircles(lat = ~latitude, lng = ~longtitude), variables formulae evaluated data.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"functions","dir":"Reference","previous_headings":"","what":"Functions","title":"Create a Leaflet map widget — leaflet","text":"leafletOptions(): Options map creation leafletCRS(): class create custom CRS","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/leaflet.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Create a Leaflet map widget — leaflet","text":"","code":"# !formatR library(leaflet) m <- leaflet() %>% addTiles() m # a map with the default OSM tile layer {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}]},\"evals\":[],\"jsHooks\":[]} # \\donttest{ # set bounds m %>% fitBounds(0, 40, 10, 50) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}],\"fitBounds\":[40,0,50,10,[]]},\"evals\":[],\"jsHooks\":[]} # move the center to Snedecor Hall m <- m %>% setView(-93.65, 42.0285, zoom = 17) m {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}],\"setView\":[[42.0285,-93.65000000000001],17,[]]},\"evals\":[],\"jsHooks\":[]} # popup m %>% addPopups(-93.65, 42.0285, \"Here is the Department of Statistics<\/b>, ISU\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addPopups\",\"args\":[42.0285,-93.65000000000001,\"Here is the Department of Statistics<\\/b>, ISU\",null,null,{\"maxWidth\":300,\"minWidth\":50,\"autoPan\":true,\"keepInView\":false,\"closeButton\":true,\"className\":\"\"}]}],\"setView\":[[42.0285,-93.65000000000001],17,[]],\"limits\":{\"lat\":[42.0285,42.0285],\"lng\":[-93.65000000000001,-93.65000000000001]}},\"evals\":[],\"jsHooks\":[]}rand_lng <- function(n = 10) rnorm(n, -93.65, .01) rand_lat <- function(n = 10) rnorm(n, 42.0285, .01) # use automatic bounds derived from lng/lat data m <- m %>% clearBounds() # popup m %>% addPopups(rand_lng(), rand_lat(), \"Random popups\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addPopups\",\"args\":[[42.03532633090344,42.03346913333052,42.04289660655913,42.04057358557952,42.03088514694102,42.02551162121993,42.04234621050239,42.02149930977988,42.04710931508507,42.04653924959101],[-93.65639033687326,-93.64601097062985,-93.63658026499833,-93.65037607421529,-93.64456329885854,-93.63259781605761,-93.6532445593915,-93.65447511333052,-93.64583917474124,-93.66295865367805],\"Random popups\",null,null,{\"maxWidth\":300,\"minWidth\":50,\"autoPan\":true,\"keepInView\":false,\"closeButton\":true,\"className\":\"\"}]}],\"limits\":{\"lat\":[42.02149930977988,42.04710931508507],\"lng\":[-93.66295865367805,-93.63259781605761]}},\"evals\":[],\"jsHooks\":[]} # marker m %>% addMarkers(rand_lng(), rand_lat()) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMarkers\",\"args\":[[42.04295014910009,42.02426518379451,42.02116250403391,42.02141515246801,42.04325092459101,42.03695004184792,42.04143994431286,42.03148161142113,42.02444317509959,42.02711192422018],[-93.66356043492232,-93.65314751071733,-93.66019265181163,-93.65612249655628,-93.65289068748586,-93.6349301670837,-93.64632277306379,-93.6502003494124,-93.65979921959125,-93.66400912332638],null,null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.02116250403391,42.04325092459101],\"lng\":[-93.66400912332638,-93.6349301670837]}},\"evals\":[],\"jsHooks\":[]}m %>% addMarkers( rand_lng(), rand_lat(), popup = paste(\"A random letter\", sample(LETTERS, 10)) ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMarkers\",\"args\":[[42.02023647829722,42.0289739913255,42.02556892627634,42.04057632181082,42.02882001383617,42.03030397549657,42.02927160579836,42.03408395337855,42.02683145632909,42.02622019380988],[-93.65222592731399,-93.63252849742631,-93.65081704668162,-93.64875858413929,-93.64607763858525,-93.64621580029898,-93.64833824326827,-93.6384661263063,-93.64985251697732,-93.64978559155014],null,null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},[\"A random letter K\",\"A random letter J\",\"A random letter U\",\"A random letter H\",\"A random letter G\",\"A random letter X\",\"A random letter A\",\"A random letter L\",\"A random letter F\",\"A random letter Y\"],null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.02023647829722,42.04057632181082],\"lng\":[-93.65222592731399,-93.63252849742631]}},\"evals\":[],\"jsHooks\":[]} Rlogo <- file.path(R.home(\"doc\"), \"html\", \"logo.jpg\") m %>% addMarkers( 174.7690922, -36.8523071, icon = list( iconUrl = Rlogo, iconSize = c(100, 76) ), popup = \"R was born here!\" ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMarkers\",\"args\":[-36.8523071,174.7690922,{\"iconUrl\":{\"data\":\"data:image/jpeg;base64,/9j/4QSfRXhpZgAATU0AKgAAAAgABwESAAMAAAABAAEAAAEaAAUAAAABAAAAYgEbAAUAAAABAAAAagEoAAMAAAABAAIAAAExAAIAAAAkAAAAcgEyAAIAAAAUAAAAlodpAAQAAAABAAAArAAAANgALcbAAAAnEAAtxsAAACcQQWRvYmUgUGhvdG9zaG9wIENDIDIwMTUgKE1hY2ludG9zaCkAMjAxNjowMjoxNSAwODowMjoxMgAAAAADoAEAAwAAAAEAAQAAoAIABAAAAAEAAABkoAMABAAAAAEAAABMAAAAAAAAAAYBAwADAAAAAQAGAAABGgAFAAAAAQAAASYBGwAFAAAAAQAAAS4BKAADAAAAAQACAAACAQAEAAAAAQAAATYCAgAEAAAAAQAAA2EAAAAAAAAASAAAAAEAAABIAAAAAf/Y/+0ADEFkb2JlX0NNAAH/7gAOQWRvYmUAZIAAAAAB/9sAhAAMCAgICQgMCQkMEQsKCxEVDwwMDxUYExMVExMYEQwMDAwMDBEMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMAQ0LCw0ODRAODhAUDg4OFBQODg4OFBEMDAwMDBERDAwMDAwMEQwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAz/wAARCAASABgDASIAAhEBAxEB/90ABAAC/8QBPwAAAQUBAQEBAQEAAAAAAAAAAwABAgQFBgcICQoLAQABBQEBAQEBAQAAAAAAAAABAAIDBAUGBwgJCgsQAAEEAQMCBAIFBwYIBQMMMwEAAhEDBCESMQVBUWETInGBMgYUkaGxQiMkFVLBYjM0coLRQwclklPw4fFjczUWorKDJkSTVGRFwqN0NhfSVeJl8rOEw9N14/NGJ5SkhbSVxNTk9KW1xdXl9VZmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9xEAAgIBAgQEAwQFBgcHBgU1AQACEQMhMRIEQVFhcSITBTKBkRShsUIjwVLR8DMkYuFygpJDUxVjczTxJQYWorKDByY1wtJEk1SjF2RFVTZ0ZeLys4TD03Xj80aUpIW0lcTU5PSltcXV5fVWZnaGlqa2xtbm9ic3R1dnd4eXp7fH/9oADAMBAAIRAxEAPwDurMzMz8o4+K706xOoMe0aeo9493u/casbqPWOk9Nz7cDKOfdk0bd76G17Tua20envs9X6L1r24uf0vMdlYlX2nHfIdW36QaTu2bfpe13825m9cf1DJzL/AK6W39Oc/Dynkek6ysvcwjHax7X47WZDve0Pb/NP/wBIrHLY4TlPj2jAz34fl/eYc85QEeHeUhHa93e6R9a8e3JNVF176me6yjMaBaGAhtt1F1TrGv8As877qLPf6X82ksb6qVM6l13IPUbHjqrt/rttDWgsBbXksYxgb+sbW+hY39GynH/mvUf/ADCUvsY/vHt0a4eLf08f9/8Azf8AXY/dn7PHYvirx4f7n+c/qv8A/9D1VcIP/wAqH5vP9r+hrxBJWeV/y3+xmwcx/k/9pF9mzf8A8pVf/hir+jfzn8z/AIT/AN3P+6aS8ZSVr9H/ANNmD9L/AKs//9n/7Q0QUGhvdG9zaG9wIDMuMAA4QklNBCUAAAAAABAAAAAAAAAAAAAAAAAAAAAAOEJJTQQ6AAAAAAFnAAAAEAAAAAEAAAAAAAtwcmludE91dHB1dAAAAAcAAAAAQ2xyU2VudW0AAAAAQ2xyUwAAAABSR0JDAAAAAE5tICBURVhUAAAAEwBDAGEAbQBlAHIAYQAgAFIARwBCACAAUAByAG8AZgBpAGwAZQAAAAAAAEludGVlbnVtAAAAAEludGUAAAAAQ2xybQAAAABNcEJsYm9vbAEAAAAPcHJpbnRTaXh0ZWVuQml0Ym9vbAAAAAALcHJpbnRlck5hbWVURVhUAAAAGQBPAGYAZgBpAGMAZQBqAGUAdAAgAFAAcgBvACAAOAA1ADAAMAAgAEEAOQAwADkAZwAAAAAAD3ByaW50UHJvb2ZTZXR1cE9iamMAAAAMAFAAcgBvAG8AZgAgAFMAZQB0AHUAcAAAAAAACnByb29mU2V0dXAAAAABAAAAAEJsdG5lbnVtAAAADGJ1aWx0aW5Qcm9vZgAAAAlwcm9vZkNNWUsAOEJJTQQ7AAAAAAItAAAAEAAAAAEAAAAAABJwcmludE91dHB1dE9wdGlvbnMAAAAXAAAAAENwdG5ib29sAAAAAABDbGJyYm9vbAAAAAAAUmdzTWJvb2wAAAAAAENybkNib29sAAAAAABDbnRDYm9vbAAAAAAATGJsc2Jvb2wAAAAAAE5ndHZib29sAAAAAABFbWxEYm9vbAAAAAAASW50cmJvb2wAAAAAAEJja2dPYmpjAAAAAQAAAAAAAFJHQkMAAAADAAAAAFJkICBkb3ViQG/gAAAAAAAAAAAAR3JuIGRvdWJAb+AAAAAAAAAAAABCbCAgZG91YkBv4AAAAAAAAAAAAEJyZFRVbnRGI1JsdAAAAAAAAAAAAAAAAEJsZCBVbnRGI1JsdAAAAAAAAAAAAAAAAFJzbHRVbnRGI1B4bEBywAAAAAAAAAAACnZlY3RvckRhdGFib29sAQAAAABQZ1BzZW51bQAAAABQZ1BzAAAAAFBnUEMAAAAATGVmdFVudEYjUmx0AAAAAAAAAAAAAAAAVG9wIFVudEYjUmx0AAAAAAAAAAAAAAAAU2NsIFVudEYjUHJjQFkAAAAAAAAAAAAQY3JvcFdoZW5QcmludGluZ2Jvb2wAAAAADmNyb3BSZWN0Qm90dG9tbG9uZwAAAAAAAAAMY3JvcFJlY3RMZWZ0bG9uZwAAAAAAAAANY3JvcFJlY3RSaWdodGxvbmcAAAAAAAAAC2Nyb3BSZWN0VG9wbG9uZwAAAAAAOEJJTQPtAAAAAAAQASwAAAABAAIBLAAAAAEAAjhCSU0EJgAAAAAADgAAAAAAAAAAAAA/gAAAOEJJTQQNAAAAAAAEAAAAHjhCSU0EGQAAAAAABAAAAB44QklNA/MAAAAAAAkAAAAAAAAAAAEAOEJJTScQAAAAAAAKAAEAAAAAAAAAAjhCSU0D9QAAAAAASAAvZmYAAQBsZmYABgAAAAAAAQAvZmYAAQChmZoABgAAAAAAAQAyAAAAAQBaAAAABgAAAAAAAQA1AAAAAQAtAAAABgAAAAAAAThCSU0D+AAAAAAAcAAA/////////////////////////////wPoAAAAAP////////////////////////////8D6AAAAAD/////////////////////////////A+gAAAAA/////////////////////////////wPoAAA4QklNBAAAAAAAAAIAADhCSU0EAgAAAAAAAgAAOEJJTQQwAAAAAAABAQA4QklNBC0AAAAAAAYAAQAAAAI4QklNBAgAAAAAABAAAAABAAACQAAAAkAAAAAAOEJJTQQeAAAAAAAEAAAAADhCSU0EGgAAAAADPwAAAAYAAAAAAAAAAAAAAEwAAABkAAAABQBSAGwAbwBnAG8AAAABAAAAAAAAAAAAAAAAAAAAAAAAAAEAAAAAAAAAAAAAAGQAAABMAAAAAAAAAAAAAAAAAAAAAAEAAAAAAAAAAAAAAAAAAAAAAAAAEAAAAAEAAAAAAABudWxsAAAAAgAAAAZib3VuZHNPYmpjAAAAAQAAAAAAAFJjdDEAAAAEAAAAAFRvcCBsb25nAAAAAAAAAABMZWZ0bG9uZwAAAAAAAAAAQnRvbWxvbmcAAABMAAAAAFJnaHRsb25nAAAAZAAAAAZzbGljZXNWbExzAAAAAU9iamMAAAABAAAAAAAFc2xpY2UAAAASAAAAB3NsaWNlSURsb25nAAAAAAAAAAdncm91cElEbG9uZwAAAAAAAAAGb3JpZ2luZW51bQAAAAxFU2xpY2VPcmlnaW4AAAANYXV0b0dlbmVyYXRlZAAAAABUeXBlZW51bQAAAApFU2xpY2VUeXBlAAAAAEltZyAAAAAGYm91bmRzT2JqYwAAAAEAAAAAAABSY3QxAAAABAAAAABUb3AgbG9uZwAAAAAAAAAATGVmdGxvbmcAAAAAAAAAAEJ0b21sb25nAAAATAAAAABSZ2h0bG9uZwAAAGQAAAADdXJsVEVYVAAAAAEAAAAAAABudWxsVEVYVAAAAAEAAAAAAABNc2dlVEVYVAAAAAEAAAAAAAZhbHRUYWdURVhUAAAAAQAAAAAADmNlbGxUZXh0SXNIVE1MYm9vbAEAAAAIY2VsbFRleHRURVhUAAAAAQAAAAAACWhvcnpBbGlnbmVudW0AAAAPRVNsaWNlSG9yekFsaWduAAAAB2RlZmF1bHQAAAAJdmVydEFsaWduZW51bQAAAA9FU2xpY2VWZXJ0QWxpZ24AAAAHZGVmYXVsdAAAAAtiZ0NvbG9yVHlwZWVudW0AAAARRVNsaWNlQkdDb2xvclR5cGUAAAAATm9uZQAAAAl0b3BPdXRzZXRsb25nAAAAAAAAAApsZWZ0T3V0c2V0bG9uZwAAAAAAAAAMYm90dG9tT3V0c2V0bG9uZwAAAAAAAAALcmlnaHRPdXRzZXRsb25nAAAAAAA4QklNBCgAAAAAAAwAAAACP/AAAAAAAAA4QklNBBQAAAAAAAQAAAACOEJJTQQMAAAAAAN9AAAAAQAAABgAAAASAAAASAAABRAAAANhABgAAf/Y/+0ADEFkb2JlX0NNAAH/7gAOQWRvYmUAZIAAAAAB/9sAhAAMCAgICQgMCQkMEQsKCxEVDwwMDxUYExMVExMYEQwMDAwMDBEMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMAQ0LCw0ODRAODhAUDg4OFBQODg4OFBEMDAwMDBERDAwMDAwMEQwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAz/wAARCAASABgDASIAAhEBAxEB/90ABAAC/8QBPwAAAQUBAQEBAQEAAAAAAAAAAwABAgQFBgcICQoLAQABBQEBAQEBAQAAAAAAAAABAAIDBAUGBwgJCgsQAAEEAQMCBAIFBwYIBQMMMwEAAhEDBCESMQVBUWETInGBMgYUkaGxQiMkFVLBYjM0coLRQwclklPw4fFjczUWorKDJkSTVGRFwqN0NhfSVeJl8rOEw9N14/NGJ5SkhbSVxNTk9KW1xdXl9VZmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9xEAAgIBAgQEAwQFBgcHBgU1AQACEQMhMRIEQVFhcSITBTKBkRShsUIjwVLR8DMkYuFygpJDUxVjczTxJQYWorKDByY1wtJEk1SjF2RFVTZ0ZeLys4TD03Xj80aUpIW0lcTU5PSltcXV5fVWZnaGlqa2xtbm9ic3R1dnd4eXp7fH/9oADAMBAAIRAxEAPwDurMzMz8o4+K706xOoMe0aeo9493u/casbqPWOk9Nz7cDKOfdk0bd76G17Tua20envs9X6L1r24uf0vMdlYlX2nHfIdW36QaTu2bfpe13825m9cf1DJzL/AK6W39Oc/Dynkek6ysvcwjHax7X47WZDve0Pb/NP/wBIrHLY4TlPj2jAz34fl/eYc85QEeHeUhHa93e6R9a8e3JNVF176me6yjMaBaGAhtt1F1TrGv8As877qLPf6X82ksb6qVM6l13IPUbHjqrt/rttDWgsBbXksYxgb+sbW+hY39GynH/mvUf/ADCUvsY/vHt0a4eLf08f9/8Azf8AXY/dn7PHYvirx4f7n+c/qv8A/9D1VcIP/wAqH5vP9r+hrxBJWeV/y3+xmwcx/k/9pF9mzf8A8pVf/hir+jfzn8z/AIT/AN3P+6aS8ZSVr9H/ANNmD9L/AKs//9kAOEJJTQQhAAAAAABdAAAAAQEAAAAPAEEAZABvAGIAZQAgAFAAaABvAHQAbwBzAGgAbwBwAAAAFwBBAGQAbwBiAGUAIABQAGgAbwB0AG8AcwBoAG8AcAAgAEMAQwAgADIAMAAxADUAAAABADhCSU0EBgAAAAAABwAGAAAAAQEA/+EOWmh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC8APD94cGFja2V0IGJlZ2luPSLvu78iIGlkPSJXNU0wTXBDZWhpSHpyZVN6TlRjemtjOWQiPz4gPHg6eG1wbWV0YSB4bWxuczp4PSJhZG9iZTpuczptZXRhLyIgeDp4bXB0az0iQWRvYmUgWE1QIENvcmUgNS42LWMxMTEgNzkuMTU4MzI1LCAyMDE1LzA5LzEwLTAxOjEwOjIwICAgICAgICAiPiA8cmRmOlJERiB4bWxuczpyZGY9Imh0dHA6Ly93d3cudzMub3JnLzE5OTkvMDIvMjItcmRmLXN5bnRheC1ucyMiPiA8cmRmOkRlc2NyaXB0aW9uIHJkZjphYm91dD0iIiB4bWxuczp4bXA9Imh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC8iIHhtbG5zOmRjPSJodHRwOi8vcHVybC5vcmcvZGMvZWxlbWVudHMvMS4xLyIgeG1sbnM6cGhvdG9zaG9wPSJodHRwOi8vbnMuYWRvYmUuY29tL3Bob3Rvc2hvcC8xLjAvIiB4bWxuczp4bXBNTT0iaHR0cDovL25zLmFkb2JlLmNvbS94YXAvMS4wL21tLyIgeG1sbnM6c3RFdnQ9Imh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC9zVHlwZS9SZXNvdXJjZUV2ZW50IyIgeG1wOkNyZWF0b3JUb29sPSJBZG9iZSBQaG90b3Nob3AgQ0MgMjAxNSAoTWFjaW50b3NoKSIgeG1wOkNyZWF0ZURhdGU9IjIwMTYtMDItMTNUMTA6MzY6MjBaIiB4bXA6TW9kaWZ5RGF0ZT0iMjAxNi0wMi0xNVQwODowMjoxMloiIHhtcDpNZXRhZGF0YURhdGU9IjIwMTYtMDItMTVUMDg6MDI6MTJaIiBkYzpmb3JtYXQ9ImltYWdlL2pwZWciIHBob3Rvc2hvcDpDb2xvck1vZGU9IjMiIHBob3Rvc2hvcDpJQ0NQcm9maWxlPSJzUkdCIElFQzYxOTY2LTIuMSIgeG1wTU06SW5zdGFuY2VJRD0ieG1wLmlpZDpiNGM3MjU2MS0zM2VhLTRmMDItOGI3ZC05M2M3ZWJhYWIwMmEiIHhtcE1NOkRvY3VtZW50SUQ9ImFkb2JlOmRvY2lkOnBob3Rvc2hvcDpjYjEyZGFiNC0xNDQ4LTExNzktYmY1NS1lZTVmNmFlZDg2NWQiIHhtcE1NOk9yaWdpbmFsRG9jdW1lbnRJRD0ieG1wLmRpZDozMDM3M2EyOC1jMmU4LTQxMDAtYWRiOC0yZTg0NTY1NGFlZWMiPiA8eG1wTU06SGlzdG9yeT4gPHJkZjpTZXE+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJjcmVhdGVkIiBzdEV2dDppbnN0YW5jZUlEPSJ4bXAuaWlkOjMwMzczYTI4LWMyZTgtNDEwMC1hZGI4LTJlODQ1NjU0YWVlYyIgc3RFdnQ6d2hlbj0iMjAxNi0wMi0xM1QxMDozNjoyMFoiIHN0RXZ0OnNvZnR3YXJlQWdlbnQ9IkFkb2JlIFBob3Rvc2hvcCBDQyAyMDIyIChNYWNpbnRvc2gpIi8+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJjb252ZXJ0ZWQiIHN0RXZ0OnBhcmFtZXRlcnM9ImZyb20gYXBwbGljYXRpb24vdm5kLmFkb2JlLnBob3Rvc2hvcCB0byBpbWFnZS9qcGVnIi8+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJzYXZlZCIgc3RFdnQ6aW5zdGFuY2VJRD0ieG1wLmlpZDpiNGM3MjU2MS0zM2VhLTRmMDItOGI3ZC05M2M3ZWJhYWIwMmEiIHN0RXZ0OndoZW49IjIwMTYtMDItMTVUMDg6MDI6MTJaIiBzdEV2dDpzb2Z0d2FyZUFnZW50PSJBZG9iZSBQaG90b3Nob3AgQ0MgMjAyMiAoTWFjaW50b3NoKSIgc3RFdnQ6Y2hhbmdlZD0iLyIvPiA8L3JkZjpTZXE+IDwveG1wTU06SGlzdG9yeT4gPC9yZGY6RGVzY3JpcHRpb24+IDwvcmRmOlJERj4gPC94OnhtcG1ldGE+ICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgPD94cGFja2V0IGVuZD0idyI/Pv/iDFhJQ0NfUFJPRklMRQABAQAADEhMaW5vAhAAAG1udHJSR0IgWFlaIAfOAAIACQAGADEAAGFjc3BNU0ZUAAAAAElFQyBzUkdCAAAAAAAAAAAAAAABAAD21gABAAAAANMtSFAgIAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAEWNwcnQAAAFQAAAAM2Rlc2MAAAGEAAAAbHd0cHQAAAHwAAAAFGJrcHQAAAIEAAAAFHJYWVoAAAIYAAAAFGdYWVoAAAIsAAAAFGJYWVoAAAJAAAAAFGRtbmQAAAJUAAAAcGRtZGQAAALEAAAAiHZ1ZWQAAANMAAAAhnZpZXcAAAPUAAAAJGx1bWkAAAP4AAAAFG1lYXMAAAQMAAAAJHRlY2gAAAQwAAAADHJUUkMAAAQ8AAAIDGdUUkMAAAQ8AAAIDGJUUkMAAAQ8AAAIDHRleHQAAAAAQ29weXJpZ2h0IChjKSAxOTk4IEhld2xldHQtUGFja2FyZCBDb21wYW55AABkZXNjAAAAAAAAABJzUkdCIElFQzYxOTY2LTIuMQAAAAAAAAAAAAAAEnNSR0IgSUVDNjE5NjYtMi4xAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAABYWVogAAAAAAAA81EAAQAAAAEWzFhZWiAAAAAAAAAAAAAAAAAAAAAAWFlaIAAAAAAAAG+iAAA49QAAA5BYWVogAAAAAAAAYpkAALeFAAAY2lhZWiAAAAAAAAAkoAAAD4QAALbPZGVzYwAAAAAAAAAWSUVDIGh0dHA6Ly93d3cuaWVjLmNoAAAAAAAAAAAAAAAWSUVDIGh0dHA6Ly93d3cuaWVjLmNoAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAGRlc2MAAAAAAAAALklFQyA2MTk2Ni0yLjEgRGVmYXVsdCBSR0IgY29sb3VyIHNwYWNlIC0gc1JHQgAAAAAAAAAAAAAALklFQyA2MTk2Ni0yLjEgRGVmYXVsdCBSR0IgY29sb3VyIHNwYWNlIC0gc1JHQgAAAAAAAAAAAAAAAAAAAAAAAAAAAABkZXNjAAAAAAAAACxSZWZlcmVuY2UgVmlld2luZyBDb25kaXRpb24gaW4gSUVDNjE5NjYtMi4xAAAAAAAAAAAAAAAsUmVmZXJlbmNlIFZpZXdpbmcgQ29uZGl0aW9uIGluIElFQzYxOTY2LTIuMQAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAdmlldwAAAAAAE6T+ABRfLgAQzxQAA+3MAAQTCwADXJ4AAAABWFlaIAAAAAAATAlWAFAAAABXH+dtZWFzAAAAAAAAAAEAAAAAAAAAAAAAAAAAAAAAAAACjwAAAAJzaWcgAAAAAENSVCBjdXJ2AAAAAAAABAAAAAAFAAoADwAUABkAHgAjACgALQAyADcAOwBAAEUASgBPAFQAWQBeAGMAaABtAHIAdwB8AIEAhgCLAJAAlQCaAJ8ApACpAK4AsgC3ALwAwQDGAMsA0ADVANsA4ADlAOsA8AD2APsBAQEHAQ0BEwEZAR8BJQErATIBOAE+AUUBTAFSAVkBYAFnAW4BdQF8AYMBiwGSAZoBoQGpAbEBuQHBAckB0QHZAeEB6QHyAfoCAwIMAhQCHQImAi8COAJBAksCVAJdAmcCcQJ6AoQCjgKYAqICrAK2AsECywLVAuAC6wL1AwADCwMWAyEDLQM4A0MDTwNaA2YDcgN+A4oDlgOiA64DugPHA9MD4APsA/kEBgQTBCAELQQ7BEgEVQRjBHEEfgSMBJoEqAS2BMQE0wThBPAE/gUNBRwFKwU6BUkFWAVnBXcFhgWWBaYFtQXFBdUF5QX2BgYGFgYnBjcGSAZZBmoGewaMBp0GrwbABtEG4wb1BwcHGQcrBz0HTwdhB3QHhgeZB6wHvwfSB+UH+AgLCB8IMghGCFoIbgiCCJYIqgi+CNII5wj7CRAJJQk6CU8JZAl5CY8JpAm6Cc8J5Qn7ChEKJwo9ClQKagqBCpgKrgrFCtwK8wsLCyILOQtRC2kLgAuYC7ALyAvhC/kMEgwqDEMMXAx1DI4MpwzADNkM8w0NDSYNQA1aDXQNjg2pDcMN3g34DhMOLg5JDmQOfw6bDrYO0g7uDwkPJQ9BD14Peg+WD7MPzw/sEAkQJhBDEGEQfhCbELkQ1xD1ERMRMRFPEW0RjBGqEckR6BIHEiYSRRJkEoQSoxLDEuMTAxMjE0MTYxODE6QTxRPlFAYUJxRJFGoUixStFM4U8BUSFTQVVhV4FZsVvRXgFgMWJhZJFmwWjxayFtYW+hcdF0EXZReJF64X0hf3GBsYQBhlGIoYrxjVGPoZIBlFGWsZkRm3Gd0aBBoqGlEadxqeGsUa7BsUGzsbYxuKG7Ib2hwCHCocUhx7HKMczBz1HR4dRx1wHZkdwx3sHhYeQB5qHpQevh7pHxMfPh9pH5Qfvx/qIBUgQSBsIJggxCDwIRwhSCF1IaEhziH7IiciVSKCIq8i3SMKIzgjZiOUI8Ij8CQfJE0kfCSrJNolCSU4JWgllyXHJfcmJyZXJocmtyboJxgnSSd6J6sn3CgNKD8ocSiiKNQpBik4KWspnSnQKgIqNSpoKpsqzysCKzYraSudK9EsBSw5LG4soizXLQwtQS12Last4S4WLkwugi63Lu4vJC9aL5Evxy/+MDUwbDCkMNsxEjFKMYIxujHyMioyYzKbMtQzDTNGM38zuDPxNCs0ZTSeNNg1EzVNNYc1wjX9Njc2cjauNuk3JDdgN5w31zgUOFA4jDjIOQU5Qjl/Obw5+To2OnQ6sjrvOy07azuqO+g8JzxlPKQ84z0iPWE9oT3gPiA+YD6gPuA/IT9hP6I/4kAjQGRApkDnQSlBakGsQe5CMEJyQrVC90M6Q31DwEQDREdEikTORRJFVUWaRd5GIkZnRqtG8Ec1R3tHwEgFSEtIkUjXSR1JY0mpSfBKN0p9SsRLDEtTS5pL4kwqTHJMuk0CTUpNk03cTiVObk63TwBPSU+TT91QJ1BxULtRBlFQUZtR5lIxUnxSx1MTU19TqlP2VEJUj1TbVShVdVXCVg9WXFapVvdXRFeSV+BYL1h9WMtZGllpWbhaB1pWWqZa9VtFW5Vb5Vw1XIZc1l0nXXhdyV4aXmxevV8PX2Ffs2AFYFdgqmD8YU9homH1YklinGLwY0Njl2PrZEBklGTpZT1lkmXnZj1mkmboZz1nk2fpaD9olmjsaUNpmmnxakhqn2r3a09rp2v/bFdsr20IbWBtuW4SbmtuxG8eb3hv0XArcIZw4HE6cZVx8HJLcqZzAXNdc7h0FHRwdMx1KHWFdeF2Pnabdvh3VnezeBF4bnjMeSp5iXnnekZ6pXsEe2N7wnwhfIF84X1BfaF+AX5ifsJ/I3+Ef+WAR4CogQqBa4HNgjCCkoL0g1eDuoQdhICE44VHhauGDoZyhteHO4efiASIaYjOiTOJmYn+imSKyoswi5aL/IxjjMqNMY2Yjf+OZo7OjzaPnpAGkG6Q1pE/kaiSEZJ6kuOTTZO2lCCUipT0lV+VyZY0lp+XCpd1l+CYTJi4mSSZkJn8mmia1ZtCm6+cHJyJnPedZJ3SnkCerp8dn4uf+qBpoNihR6G2oiailqMGo3aj5qRWpMelOKWpphqmi6b9p26n4KhSqMSpN6mpqhyqj6sCq3Wr6axcrNCtRK24ri2uoa8Wr4uwALB1sOqxYLHWskuywrM4s660JbSctRO1irYBtnm28Ldot+C4WbjRuUq5wro7urW7LrunvCG8m70VvY++Cr6Evv+/er/1wHDA7MFnwePCX8Lbw1jD1MRRxM7FS8XIxkbGw8dBx7/IPci8yTrJuco4yrfLNsu2zDXMtc01zbXONs62zzfPuNA50LrRPNG+0j/SwdNE08bUSdTL1U7V0dZV1tjXXNfg2GTY6Nls2fHadtr724DcBdyK3RDdlt4c3qLfKd+v4DbgveFE4cziU+Lb42Pj6+Rz5PzlhOYN5pbnH+ep6DLovOlG6dDqW+rl63Dr++yG7RHtnO4o7rTvQO/M8Fjw5fFy8f/yjPMZ86f0NPTC9VD13vZt9vv3ivgZ+Kj5OPnH+lf65/t3/Af8mP0p/br+S/7c/23////uAA5BZG9iZQBkQAAAAAH/2wCEAAICAgICAgICAgIDAgICAwQDAgIDBAUEBAQEBAUGBQUFBQUFBgYHBwgHBwYJCQoKCQkMDAwMDAwMDAwMDAwMDAwBAwMDBQQFCQYGCQ0KCQoNDw4ODg4PDwwMDAwMDw8MDAwMDAwPDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDP/AABEIAEwAZAMBEQACEQEDEQH/3QAEAA3/xAGiAAAABwEBAQEBAAAAAAAAAAAEBQMCBgEABwgJCgsBAAICAwEBAQEBAAAAAAAAAAEAAgMEBQYHCAkKCxAAAgEDAwIEAgYHAwQCBgJzAQIDEQQABSESMUFRBhNhInGBFDKRoQcVsUIjwVLR4TMWYvAkcoLxJUM0U5KismNzwjVEJ5OjszYXVGR0w9LiCCaDCQoYGYSURUaktFbTVSga8uPzxNTk9GV1hZWltcXV5fVmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9zhIWGh4iJiouMjY6PgpOUlZaXmJmam5ydnp+So6SlpqeoqaqrrK2ur6EQACAgECAwUFBAUGBAgDA20BAAIRAwQhEjFBBVETYSIGcYGRMqGx8BTB0eEjQhVSYnLxMyQ0Q4IWklMlomOywgdz0jXiRIMXVJMICQoYGSY2RRonZHRVN/Kjs8MoKdPj84SUpLTE1OT0ZXWFlaW1xdXl9UZWZnaGlqa2xtbm9kdXZ3eHl6e3x9fn9zhIWGh4iJiouMjY6Pg5SVlpeYmZqbnJ2en5KjpKWmp6ipqqusra6vr/2gAMAwEAAhEDEQA/APv5irsVY9rvmrQfLkfLVb9IZSKx2i/HM3hRFqaHxNB74QLRbxvWfzsmJePQtJSNP2bm9Ysx/wCecZAH/BHJcKOJ5xqH5mec74ktrktsh6R2yrCB8igDfecPCEWxG58x65cEmfWr6YnqXuJG/W2GlS463qqGqandIfFZnB/XhpUZbee/N9gf9F8y6igG4Rrh5F/4Fyw/DBQW2ZaX+e/nLTyq3/1TWoR9r14hFJT2eHgK/NTg4Qm3sHlv89vKOsNHb6sJPLl49BW4IktiT2EygU+bqo98iYlNvaIZobmKO4t5UngmUPDNGwZHU7gqwqCD7ZFKrirsVf/Q+/hNNzsB1OKvBvPH5rGJ5tK8ryqSlUudYoGFe4gB2/2R/wBj2OTEWJL5/ubua4lknuJnnmlYtLNIxZmY9SzGpJyTFL3l98UoN5KnbcnphVken+R/OWsKr2Hl28eJ/sTSp6CMPEPKUU/fgsLTJYvyS8+zir29la1/ZluVJ/5Jh8HEE06X8iPPdCVk0x/8kXD1/GMY8QWmP3/5M/mNaKXXRFvFXqbe5hY/QpdWP0DDxBaeaazoeu6E/p6zo95pbE0U3MLxq3+qzAA/QcIKp35L/M3zJ5FuVbTbo3OmM/K70W4JaCQH7RUf7rY/zL7VqNsTG1fdXkjz1ofn3SRqejy8ZYqJqOnSEetbSEfZcDqDT4WGx+YIFRFMmZ4Ff//R+xv5t+cpNPiXy1p0vC4u4+eqTKd1hb7MYPi/U+3zyUQxJfNTy++TYoR5ffCr0fyR+WOr+bgl/dOdK0Ina7ZayT06iFDTbtyO3hyoRkTKmQD6a8veRvLHlhEOmaXH9aQCuozgS3BPj6jD4a+C0HtkCbTT5S86/wDOcv5f+R/N3mTyfqHlDzDd3vlnUbjTbq6t/qnpSPbuUZk5zK1CRtUZ2Wj9itTqcMM0ckAJgHe+vweZ1PtTgwZZYzCRMSR06fFi3/RRD8sv+pI8z/dZf9lGZH+gHVf6pD7f1NH+jDT/AMyX2frWn/n4n+WQ/wCmH8z/APTl/wBlGP8AoB1X+qQ+39S/6MNP/Ml9n61p/wCfiv5Yj/ph/M//AE5f9lGP+gLVf6pD7f1L/ow0/wDMl9n61a3/AOfhP5Oai5sdZ8neZrawuBwmkkt7K5jof9+R/WQSPkD8srn7CayIuM4E+8j9DOHtdpiaMZD5frZbb6J+TH57aZea1+Svmixi120T1bzy+vO3pU0/fWcyrLACfhV0X0yeleuc5ruzNVoJVngY3yPMH3EbfDm73R9oafWC8UgfLqPhzeL+XfMvmP8AK3zf9YMEtnf6bMbbWdJl+ETRVHqRP1BBG6sKitGFcwiLDmP0X/xdof8AhP8Axp9a/wBwP1D9I+vQcvS48uPGv26/Dxr9rbKa3pk//9L6HeadWfVvMGsag7cvrN3IU9kVuKD6FAGWgMGLvL74VZ3+WnlRPN/mRILtSdK05PrOpDpzAICRV/yz19gcEjSQH2xHHHDHHFFGsUUShIokAVVVRQAAbAAZUyX4q/nk/wCcgz/yHD82R/39Wqf9RD5732F/iGD+pH7nyDtf/HMv9c/e8aY/dm1dcpMcVUSfvwJUif7cCp35Y81+YPJWv6Z5o8rarPouuaRMJrG/t24srDqrDoysKqysCrAkMCDlGp02PUYzjyASieYP4+1twZ54JicDUh1frJ5217T/AM3/AMofIH556faR2WqX6/orzbaQ/ZS5iLxt13ossbBSdyjp4Z4d2poDoNVPAdwDse8HcfjvfW+zdYNZp45ep5+8c0g/x3d/8qS/wh6x/wCUi4dT/vH6X1n0/wDkf8Wa+t3Of//T94azFJY6rqdlKCstndTQyKexRyp/VlwYJG8vvir6T/5x4lgZPNcdR9Z5WbHxKUmH4HITZB9K5BLsVfzv/wDOQh/5Dj+bP/gVap/1EPnvXYX+IYP6kfufIO1/8cy/1z97xonNs65+0f8Azhd5L8na3+QXl2/1nyno2r30mo6mr3l7YW88pC3TgAvIjMaAUG+eQ+12szY+0ZxhOQFR2BI6PpPs3psU9FEygCbPMA9X1Bf/AJS/lbqdnc2F9+XPlq4tLtDHPEdKtBUEU2ZYwVI7EEEHcb5zcO1NXCQlHLMEf0j+t3k9Bp5CjjjR8g/nv/Nzy9o3lH8z/P8A5X8uzGbQtA16+sdLYv6hWGCZkVC/7RSnEnuRnuPZmonn0uPJk+qUQT7yHybX4YYdRkhD6YyIHzebs39mZziP1E/Iv1If+cKvMbXdQtz5vc6Zy7qJbMHj9KSfjnkftoQe0RX8wfpfSvZQH8kb/nH9CWfoW7/5Vn/ib0m+p/4l+oepQ05fVPUr8u1fHOWvd6R//9T6h/nj5Um0vWV8zWsROnayQt2yjaK6UUNf+Miio9+WWRLEh8/vLkkMx/Lvzu3knzNbanIGk024X6tq0K7kwOQSyj+ZCAw8enfARaQ+/bC/s9Us7bUNPuY7yyvIxJbXMZqrqehBypki8Vfzt/8AOQp/5Dl+bX/gVap/1EPnvXYX+IYP6kfufIO1/wDHMv8AXP3vGGb782rr3uPkb/nJb86Py18uWvlPyX5wGj6BZyzTW9l9QsJ+LzuXkPqT28jmrGu7bds0ut9n9DrMpy5ocUj1uQ5e4u00vbOr02MY8c6iPIH7wnup/wDOYn/OR2qWNzp8/wCZVzbwXSGOWWzsrC0nAO3wTwWySxn3RgffMfH7K9mwkJDELHeZEfImj8W2ftDrpijkO/cAPtAt8ySyvK7yyu0kkjFndiSzMdyST1JzfjbYOmJtlfkLyF5q/MzzRp3lDydpcmq61qT0VFBEcEQIDzzyUIjjStWY/LqQDia3W4tHiOXKaiPt8h3lyNLpcmpyDHjFk/iz5P1U/MTSrHyT5P8Ay2/5xt8jsdZvtC9KTXXgA5XGpXHJqEDoZJJnkIJ+EFN9s8R1+tlrdRPPL+I7eQ5AfAPreh0kdJgjij/CPmev2vqn/lTll/ypr/lWfqR/XfqnrfpCh4/pPl63q168fU+Hx4bZruLe3Mf/1fvVq+k6frum3ek6pbrdWN6hjnib7wQeoIO4I6HFXwr+Y35aa15FuZLgI+oeXpXpZ6sg+xU7RzgfYbtXo3beoFolbGnkjy++SQzzyN+avmPyDPwsZBf6PK/K60W4J9Jj3aNhvGxHcbH9oGgwGNpt9c+U/wA8vIfmdYoZ9RHl7UnoGsdSIjUsf5J/7thXYVIJ/lysxIZB+Gv/ADkFNHL+eH5syROJI381aoUdTUEG4ehB7g9s947C/wAQwf1I/c+Qdrf45l/rn73jZObR172Xyf8A847/AJ0fmB5etPNfk/yLc635fv3mS01GK5tEDtbuY5AElnRxRlI3Xftmo1fbui0uQ4suQRkK2o9fg7LT9karUQGTHAmJ62OnxeP6tpmpaHqV9pGs2Fxpeq6bM9tqGm3UbRTQSxmjJIjgFSD1BGbLHkjkiJQIIO4I5EOvnCUJGMhRHMJ35K1XybpOtJc+efKt35v0Qrxk0yy1E6ZKGqPjEwhmrQfs0Ff5h1yjV4804VhmIS7yOL7LDdpp4oTvLEyj3A8P6C/ULyN+en5cReVofKf/ADiz+Xb6FrGqenBrDS24k1KGdlJUPVp5LlgCSsskjIoB2O9PIPaHT67FnA1suK94n+Ejrw8q8xQL6d2Hl0eXCTpY8NfUP4genF3+Rsh9Qfkp+SUnkmSXzh5wnGq+e9TDu7s/rLZCapkAkJPqTPU+pJXxVSRVm5+Ur5O5fR2QV//W+/mKqU8ENzDLb3MKXFvOpSaCRQ6OrChVlNQQR1BxV86edP8AnHbRdXaa+8p3n+H7x6sdOlDSWbMf5SKvFU+HIdgoyYminzF5m/Kn8wfLLSNfeXbm6tY6/wCn2A+tQlR+0TFVkH+uFyYkCinl0jsjlHBVlNGVhQgjqCMkr4T88OW86+biTUnVrip/2We59h/8Z+n/AOFxfIu1/wDHc39csUZvuzZOvfef5Gfm7+YPlb8q9B0LQPMUmm6ZbXN+0NukFuxBluXdvjeJnPxMe+eO+18Qe1Mnuj/uQ+oezH/GfD3y+8vLPz70nzV589b8z54LvWr/AEuKK182alHBVRarRIJ5TEgUGMkISf2Svhm59iu1vDmdHkO0vVDyl/FH3S5jzvvdX7WdmcUBqoDcbT8x0l8OR8vc+Tyc9HeDe7/842/nPP8Akf8AmlpPmqTlJ5d1Bf0V5wtlXmz6dM6s7oOvOFlWRabnjx6Mc0vb3ZY7R0px/wAQ3j/W/UeR+fR2nY/aB0OoE/4TtL3fs5/2v6JLG9tNSsrPUdPuY7yw1CCO5sruJg0csMqh43RhsQykEHPEJwMJGMhRGxfWYyEgCNwUVkWT/9f7+Yq7FXYq7FUk1Py15d1qv6Y0HTtVJ6m7topj97qTjav53vz7s7TTfzr/ADWsbGBLWztvNOpxwW8YoqItw4VVHYACgz3jsM/4Bg/qR+58g7X/AMcy/wBc/e8hJzauvft1/wA4S+SvKGofkB5Q1jUPLOmahqst5qvPULq1inl+G/mVaPIrEUCgCmeM+2B/1zye6P8AuQ+oezP+IQHnL7y+x9W8vaLreg6l5Z1LTobjQtXtJrG/03gFie3nQpInEUAqCemc5hzSxTE4GpRNg+Yd5lxxyQMJCwRRfzg/nV+WGp/k9+ZHmTyHqReWLTJ/U0e/cAfW7Cb47afbarIQGA6OGXtnuvZXaMdfpo5o9RuO6XUfjo+Q9o6KWjzyxHpy8x0P46vJ2bNg4L9g/wDn35+e/wDiDQbn8l/Ml7y1jyzE935MllPxT6byrLagk7tbs3JR/vs0G0eeY+2fZHhZBqsY9MtpeUuh+P3+97/2W7T8SH5eZ3jvH3d3w+73P0szhHsH/9D7+Yq7FXYq7FXYq/nv/P3/AAf/AMrv/Nn6/wDpn6z/AIq1P1Pq/wBX9Ovrtypy3pyrT2z3DsXxvyOHh4a4I9/c+T9q+F+by3f1Hu73j5/wH/2v/wDp1zZf4R/R+1wP3P8AS+x+4P8AzhP9Q/6F28n/AKN+sfVPreren9a4+rX9IT1rw2655D7W8X8oz4quo8v6ofSvZyvyMOHlZ+8vq/Obd6/Lb/n4z/yrj6z+W/6X+t/444XX/HP9P1P0RXb1/U2p69fS/wCeuehew/5msvDXh7c/53l8OfweK9rfAvHxXx78v5vn8eXxfmIf8Bf9r/8A6dc739//AEfteN/c/wBL7Ho/5O0/5Wl5F/5Vh/iD/Hn6Xt/8P1+q+nz5fvfW7el6XP1K7cOVdq5gdqf4rk/McPh8Jvn9nnfLzczs/wDxiHg8XHe3L8VXPyf0e54e+tv/2Q==\",\"index\":0},\"iconSize\":[[100,76]]},null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},\"R was born here!\",null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[-36.8523071,-36.8523071],\"lng\":[174.7690922,174.7690922]}},\"evals\":[],\"jsHooks\":[]} m %>% addMarkers(rnorm(30, 175), rnorm(30, -37), icon = list( iconUrl = Rlogo, iconSize = c(25, 19) )) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addMarkers\",\"args\":[[-36.74945600428287,-36.70394268991016,-37.50949153490204,-36.79886181470058,-36.99355626131839,-36.6449689590053,-38.39145202244976,-35.72534686878304,-38.38680873499319,-37.60308870781991,-36.66178564452072,-37.08653430701014,-36.17933032809054,-37.07878626566091,-36.97303456430403,-37.57033852742706,-37.26814491982226,-36.25793368742815,-37.25679287615806,-37.92042995804882,-39.04560029769151,-38.16583954173786,-37.83815111322449,-36.28514379899016,-37.51255226612866,-38.10189728576249,-36.46849609454593,-38.88506365342354,-37.98878234758308,-37.20284603388136],[174.8880968120105,173.6018114631305,174.588478791854,174.8570693374731,175.7949059599894,174.4250595600296,174.7061070767284,174.7093418859,175.2316128688731,174.9327946028437,176.2440048132401,174.7060736532758,174.9260285457816,175.7995256412215,174.2294663942398,175.2454727686159,173.4338079809993,174.1773032230816,174.3554916853149,174.7014262904863,173.962634650142,175.1248026372745,175.8114435546814,177.2567496719338,174.3866052762217,174.9282763834137,174.1866713548035,175.0376734823736,176.1858477317601,175.3344291894759],{\"iconUrl\":{\"data\":\"data:image/jpeg;base64,/9j/4QSfRXhpZgAATU0AKgAAAAgABwESAAMAAAABAAEAAAEaAAUAAAABAAAAYgEbAAUAAAABAAAAagEoAAMAAAABAAIAAAExAAIAAAAkAAAAcgEyAAIAAAAUAAAAlodpAAQAAAABAAAArAAAANgALcbAAAAnEAAtxsAAACcQQWRvYmUgUGhvdG9zaG9wIENDIDIwMTUgKE1hY2ludG9zaCkAMjAxNjowMjoxNSAwODowMjoxMgAAAAADoAEAAwAAAAEAAQAAoAIABAAAAAEAAABkoAMABAAAAAEAAABMAAAAAAAAAAYBAwADAAAAAQAGAAABGgAFAAAAAQAAASYBGwAFAAAAAQAAAS4BKAADAAAAAQACAAACAQAEAAAAAQAAATYCAgAEAAAAAQAAA2EAAAAAAAAASAAAAAEAAABIAAAAAf/Y/+0ADEFkb2JlX0NNAAH/7gAOQWRvYmUAZIAAAAAB/9sAhAAMCAgICQgMCQkMEQsKCxEVDwwMDxUYExMVExMYEQwMDAwMDBEMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMAQ0LCw0ODRAODhAUDg4OFBQODg4OFBEMDAwMDBERDAwMDAwMEQwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAz/wAARCAASABgDASIAAhEBAxEB/90ABAAC/8QBPwAAAQUBAQEBAQEAAAAAAAAAAwABAgQFBgcICQoLAQABBQEBAQEBAQAAAAAAAAABAAIDBAUGBwgJCgsQAAEEAQMCBAIFBwYIBQMMMwEAAhEDBCESMQVBUWETInGBMgYUkaGxQiMkFVLBYjM0coLRQwclklPw4fFjczUWorKDJkSTVGRFwqN0NhfSVeJl8rOEw9N14/NGJ5SkhbSVxNTk9KW1xdXl9VZmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9xEAAgIBAgQEAwQFBgcHBgU1AQACEQMhMRIEQVFhcSITBTKBkRShsUIjwVLR8DMkYuFygpJDUxVjczTxJQYWorKDByY1wtJEk1SjF2RFVTZ0ZeLys4TD03Xj80aUpIW0lcTU5PSltcXV5fVWZnaGlqa2xtbm9ic3R1dnd4eXp7fH/9oADAMBAAIRAxEAPwDurMzMz8o4+K706xOoMe0aeo9493u/casbqPWOk9Nz7cDKOfdk0bd76G17Tua20envs9X6L1r24uf0vMdlYlX2nHfIdW36QaTu2bfpe13825m9cf1DJzL/AK6W39Oc/Dynkek6ysvcwjHax7X47WZDve0Pb/NP/wBIrHLY4TlPj2jAz34fl/eYc85QEeHeUhHa93e6R9a8e3JNVF176me6yjMaBaGAhtt1F1TrGv8As877qLPf6X82ksb6qVM6l13IPUbHjqrt/rttDWgsBbXksYxgb+sbW+hY39GynH/mvUf/ADCUvsY/vHt0a4eLf08f9/8Azf8AXY/dn7PHYvirx4f7n+c/qv8A/9D1VcIP/wAqH5vP9r+hrxBJWeV/y3+xmwcx/k/9pF9mzf8A8pVf/hir+jfzn8z/AIT/AN3P+6aS8ZSVr9H/ANNmD9L/AKs//9n/7Q0QUGhvdG9zaG9wIDMuMAA4QklNBCUAAAAAABAAAAAAAAAAAAAAAAAAAAAAOEJJTQQ6AAAAAAFnAAAAEAAAAAEAAAAAAAtwcmludE91dHB1dAAAAAcAAAAAQ2xyU2VudW0AAAAAQ2xyUwAAAABSR0JDAAAAAE5tICBURVhUAAAAEwBDAGEAbQBlAHIAYQAgAFIARwBCACAAUAByAG8AZgBpAGwAZQAAAAAAAEludGVlbnVtAAAAAEludGUAAAAAQ2xybQAAAABNcEJsYm9vbAEAAAAPcHJpbnRTaXh0ZWVuQml0Ym9vbAAAAAALcHJpbnRlck5hbWVURVhUAAAAGQBPAGYAZgBpAGMAZQBqAGUAdAAgAFAAcgBvACAAOAA1ADAAMAAgAEEAOQAwADkAZwAAAAAAD3ByaW50UHJvb2ZTZXR1cE9iamMAAAAMAFAAcgBvAG8AZgAgAFMAZQB0AHUAcAAAAAAACnByb29mU2V0dXAAAAABAAAAAEJsdG5lbnVtAAAADGJ1aWx0aW5Qcm9vZgAAAAlwcm9vZkNNWUsAOEJJTQQ7AAAAAAItAAAAEAAAAAEAAAAAABJwcmludE91dHB1dE9wdGlvbnMAAAAXAAAAAENwdG5ib29sAAAAAABDbGJyYm9vbAAAAAAAUmdzTWJvb2wAAAAAAENybkNib29sAAAAAABDbnRDYm9vbAAAAAAATGJsc2Jvb2wAAAAAAE5ndHZib29sAAAAAABFbWxEYm9vbAAAAAAASW50cmJvb2wAAAAAAEJja2dPYmpjAAAAAQAAAAAAAFJHQkMAAAADAAAAAFJkICBkb3ViQG/gAAAAAAAAAAAAR3JuIGRvdWJAb+AAAAAAAAAAAABCbCAgZG91YkBv4AAAAAAAAAAAAEJyZFRVbnRGI1JsdAAAAAAAAAAAAAAAAEJsZCBVbnRGI1JsdAAAAAAAAAAAAAAAAFJzbHRVbnRGI1B4bEBywAAAAAAAAAAACnZlY3RvckRhdGFib29sAQAAAABQZ1BzZW51bQAAAABQZ1BzAAAAAFBnUEMAAAAATGVmdFVudEYjUmx0AAAAAAAAAAAAAAAAVG9wIFVudEYjUmx0AAAAAAAAAAAAAAAAU2NsIFVudEYjUHJjQFkAAAAAAAAAAAAQY3JvcFdoZW5QcmludGluZ2Jvb2wAAAAADmNyb3BSZWN0Qm90dG9tbG9uZwAAAAAAAAAMY3JvcFJlY3RMZWZ0bG9uZwAAAAAAAAANY3JvcFJlY3RSaWdodGxvbmcAAAAAAAAAC2Nyb3BSZWN0VG9wbG9uZwAAAAAAOEJJTQPtAAAAAAAQASwAAAABAAIBLAAAAAEAAjhCSU0EJgAAAAAADgAAAAAAAAAAAAA/gAAAOEJJTQQNAAAAAAAEAAAAHjhCSU0EGQAAAAAABAAAAB44QklNA/MAAAAAAAkAAAAAAAAAAAEAOEJJTScQAAAAAAAKAAEAAAAAAAAAAjhCSU0D9QAAAAAASAAvZmYAAQBsZmYABgAAAAAAAQAvZmYAAQChmZoABgAAAAAAAQAyAAAAAQBaAAAABgAAAAAAAQA1AAAAAQAtAAAABgAAAAAAAThCSU0D+AAAAAAAcAAA/////////////////////////////wPoAAAAAP////////////////////////////8D6AAAAAD/////////////////////////////A+gAAAAA/////////////////////////////wPoAAA4QklNBAAAAAAAAAIAADhCSU0EAgAAAAAAAgAAOEJJTQQwAAAAAAABAQA4QklNBC0AAAAAAAYAAQAAAAI4QklNBAgAAAAAABAAAAABAAACQAAAAkAAAAAAOEJJTQQeAAAAAAAEAAAAADhCSU0EGgAAAAADPwAAAAYAAAAAAAAAAAAAAEwAAABkAAAABQBSAGwAbwBnAG8AAAABAAAAAAAAAAAAAAAAAAAAAAAAAAEAAAAAAAAAAAAAAGQAAABMAAAAAAAAAAAAAAAAAAAAAAEAAAAAAAAAAAAAAAAAAAAAAAAAEAAAAAEAAAAAAABudWxsAAAAAgAAAAZib3VuZHNPYmpjAAAAAQAAAAAAAFJjdDEAAAAEAAAAAFRvcCBsb25nAAAAAAAAAABMZWZ0bG9uZwAAAAAAAAAAQnRvbWxvbmcAAABMAAAAAFJnaHRsb25nAAAAZAAAAAZzbGljZXNWbExzAAAAAU9iamMAAAABAAAAAAAFc2xpY2UAAAASAAAAB3NsaWNlSURsb25nAAAAAAAAAAdncm91cElEbG9uZwAAAAAAAAAGb3JpZ2luZW51bQAAAAxFU2xpY2VPcmlnaW4AAAANYXV0b0dlbmVyYXRlZAAAAABUeXBlZW51bQAAAApFU2xpY2VUeXBlAAAAAEltZyAAAAAGYm91bmRzT2JqYwAAAAEAAAAAAABSY3QxAAAABAAAAABUb3AgbG9uZwAAAAAAAAAATGVmdGxvbmcAAAAAAAAAAEJ0b21sb25nAAAATAAAAABSZ2h0bG9uZwAAAGQAAAADdXJsVEVYVAAAAAEAAAAAAABudWxsVEVYVAAAAAEAAAAAAABNc2dlVEVYVAAAAAEAAAAAAAZhbHRUYWdURVhUAAAAAQAAAAAADmNlbGxUZXh0SXNIVE1MYm9vbAEAAAAIY2VsbFRleHRURVhUAAAAAQAAAAAACWhvcnpBbGlnbmVudW0AAAAPRVNsaWNlSG9yekFsaWduAAAAB2RlZmF1bHQAAAAJdmVydEFsaWduZW51bQAAAA9FU2xpY2VWZXJ0QWxpZ24AAAAHZGVmYXVsdAAAAAtiZ0NvbG9yVHlwZWVudW0AAAARRVNsaWNlQkdDb2xvclR5cGUAAAAATm9uZQAAAAl0b3BPdXRzZXRsb25nAAAAAAAAAApsZWZ0T3V0c2V0bG9uZwAAAAAAAAAMYm90dG9tT3V0c2V0bG9uZwAAAAAAAAALcmlnaHRPdXRzZXRsb25nAAAAAAA4QklNBCgAAAAAAAwAAAACP/AAAAAAAAA4QklNBBQAAAAAAAQAAAACOEJJTQQMAAAAAAN9AAAAAQAAABgAAAASAAAASAAABRAAAANhABgAAf/Y/+0ADEFkb2JlX0NNAAH/7gAOQWRvYmUAZIAAAAAB/9sAhAAMCAgICQgMCQkMEQsKCxEVDwwMDxUYExMVExMYEQwMDAwMDBEMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMAQ0LCw0ODRAODhAUDg4OFBQODg4OFBEMDAwMDBERDAwMDAwMEQwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAz/wAARCAASABgDASIAAhEBAxEB/90ABAAC/8QBPwAAAQUBAQEBAQEAAAAAAAAAAwABAgQFBgcICQoLAQABBQEBAQEBAQAAAAAAAAABAAIDBAUGBwgJCgsQAAEEAQMCBAIFBwYIBQMMMwEAAhEDBCESMQVBUWETInGBMgYUkaGxQiMkFVLBYjM0coLRQwclklPw4fFjczUWorKDJkSTVGRFwqN0NhfSVeJl8rOEw9N14/NGJ5SkhbSVxNTk9KW1xdXl9VZmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9xEAAgIBAgQEAwQFBgcHBgU1AQACEQMhMRIEQVFhcSITBTKBkRShsUIjwVLR8DMkYuFygpJDUxVjczTxJQYWorKDByY1wtJEk1SjF2RFVTZ0ZeLys4TD03Xj80aUpIW0lcTU5PSltcXV5fVWZnaGlqa2xtbm9ic3R1dnd4eXp7fH/9oADAMBAAIRAxEAPwDurMzMz8o4+K706xOoMe0aeo9493u/casbqPWOk9Nz7cDKOfdk0bd76G17Tua20envs9X6L1r24uf0vMdlYlX2nHfIdW36QaTu2bfpe13825m9cf1DJzL/AK6W39Oc/Dynkek6ysvcwjHax7X47WZDve0Pb/NP/wBIrHLY4TlPj2jAz34fl/eYc85QEeHeUhHa93e6R9a8e3JNVF176me6yjMaBaGAhtt1F1TrGv8As877qLPf6X82ksb6qVM6l13IPUbHjqrt/rttDWgsBbXksYxgb+sbW+hY39GynH/mvUf/ADCUvsY/vHt0a4eLf08f9/8Azf8AXY/dn7PHYvirx4f7n+c/qv8A/9D1VcIP/wAqH5vP9r+hrxBJWeV/y3+xmwcx/k/9pF9mzf8A8pVf/hir+jfzn8z/AIT/AN3P+6aS8ZSVr9H/ANNmD9L/AKs//9kAOEJJTQQhAAAAAABdAAAAAQEAAAAPAEEAZABvAGIAZQAgAFAAaABvAHQAbwBzAGgAbwBwAAAAFwBBAGQAbwBiAGUAIABQAGgAbwB0AG8AcwBoAG8AcAAgAEMAQwAgADIAMAAxADUAAAABADhCSU0EBgAAAAAABwAGAAAAAQEA/+EOWmh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC8APD94cGFja2V0IGJlZ2luPSLvu78iIGlkPSJXNU0wTXBDZWhpSHpyZVN6TlRjemtjOWQiPz4gPHg6eG1wbWV0YSB4bWxuczp4PSJhZG9iZTpuczptZXRhLyIgeDp4bXB0az0iQWRvYmUgWE1QIENvcmUgNS42LWMxMTEgNzkuMTU4MzI1LCAyMDE1LzA5LzEwLTAxOjEwOjIwICAgICAgICAiPiA8cmRmOlJERiB4bWxuczpyZGY9Imh0dHA6Ly93d3cudzMub3JnLzE5OTkvMDIvMjItcmRmLXN5bnRheC1ucyMiPiA8cmRmOkRlc2NyaXB0aW9uIHJkZjphYm91dD0iIiB4bWxuczp4bXA9Imh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC8iIHhtbG5zOmRjPSJodHRwOi8vcHVybC5vcmcvZGMvZWxlbWVudHMvMS4xLyIgeG1sbnM6cGhvdG9zaG9wPSJodHRwOi8vbnMuYWRvYmUuY29tL3Bob3Rvc2hvcC8xLjAvIiB4bWxuczp4bXBNTT0iaHR0cDovL25zLmFkb2JlLmNvbS94YXAvMS4wL21tLyIgeG1sbnM6c3RFdnQ9Imh0dHA6Ly9ucy5hZG9iZS5jb20veGFwLzEuMC9zVHlwZS9SZXNvdXJjZUV2ZW50IyIgeG1wOkNyZWF0b3JUb29sPSJBZG9iZSBQaG90b3Nob3AgQ0MgMjAxNSAoTWFjaW50b3NoKSIgeG1wOkNyZWF0ZURhdGU9IjIwMTYtMDItMTNUMTA6MzY6MjBaIiB4bXA6TW9kaWZ5RGF0ZT0iMjAxNi0wMi0xNVQwODowMjoxMloiIHhtcDpNZXRhZGF0YURhdGU9IjIwMTYtMDItMTVUMDg6MDI6MTJaIiBkYzpmb3JtYXQ9ImltYWdlL2pwZWciIHBob3Rvc2hvcDpDb2xvck1vZGU9IjMiIHBob3Rvc2hvcDpJQ0NQcm9maWxlPSJzUkdCIElFQzYxOTY2LTIuMSIgeG1wTU06SW5zdGFuY2VJRD0ieG1wLmlpZDpiNGM3MjU2MS0zM2VhLTRmMDItOGI3ZC05M2M3ZWJhYWIwMmEiIHhtcE1NOkRvY3VtZW50SUQ9ImFkb2JlOmRvY2lkOnBob3Rvc2hvcDpjYjEyZGFiNC0xNDQ4LTExNzktYmY1NS1lZTVmNmFlZDg2NWQiIHhtcE1NOk9yaWdpbmFsRG9jdW1lbnRJRD0ieG1wLmRpZDozMDM3M2EyOC1jMmU4LTQxMDAtYWRiOC0yZTg0NTY1NGFlZWMiPiA8eG1wTU06SGlzdG9yeT4gPHJkZjpTZXE+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJjcmVhdGVkIiBzdEV2dDppbnN0YW5jZUlEPSJ4bXAuaWlkOjMwMzczYTI4LWMyZTgtNDEwMC1hZGI4LTJlODQ1NjU0YWVlYyIgc3RFdnQ6d2hlbj0iMjAxNi0wMi0xM1QxMDozNjoyMFoiIHN0RXZ0OnNvZnR3YXJlQWdlbnQ9IkFkb2JlIFBob3Rvc2hvcCBDQyAyMDIyIChNYWNpbnRvc2gpIi8+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJjb252ZXJ0ZWQiIHN0RXZ0OnBhcmFtZXRlcnM9ImZyb20gYXBwbGljYXRpb24vdm5kLmFkb2JlLnBob3Rvc2hvcCB0byBpbWFnZS9qcGVnIi8+IDxyZGY6bGkgc3RFdnQ6YWN0aW9uPSJzYXZlZCIgc3RFdnQ6aW5zdGFuY2VJRD0ieG1wLmlpZDpiNGM3MjU2MS0zM2VhLTRmMDItOGI3ZC05M2M3ZWJhYWIwMmEiIHN0RXZ0OndoZW49IjIwMTYtMDItMTVUMDg6MDI6MTJaIiBzdEV2dDpzb2Z0d2FyZUFnZW50PSJBZG9iZSBQaG90b3Nob3AgQ0MgMjAyMiAoTWFjaW50b3NoKSIgc3RFdnQ6Y2hhbmdlZD0iLyIvPiA8L3JkZjpTZXE+IDwveG1wTU06SGlzdG9yeT4gPC9yZGY6RGVzY3JpcHRpb24+IDwvcmRmOlJERj4gPC94OnhtcG1ldGE+ICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgICAgPD94cGFja2V0IGVuZD0idyI/Pv/iDFhJQ0NfUFJPRklMRQABAQAADEhMaW5vAhAAAG1udHJSR0IgWFlaIAfOAAIACQAGADEAAGFjc3BNU0ZUAAAAAElFQyBzUkdCAAAAAAAAAAAAAAABAAD21gABAAAAANMtSFAgIAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAEWNwcnQAAAFQAAAAM2Rlc2MAAAGEAAAAbHd0cHQAAAHwAAAAFGJrcHQAAAIEAAAAFHJYWVoAAAIYAAAAFGdYWVoAAAIsAAAAFGJYWVoAAAJAAAAAFGRtbmQAAAJUAAAAcGRtZGQAAALEAAAAiHZ1ZWQAAANMAAAAhnZpZXcAAAPUAAAAJGx1bWkAAAP4AAAAFG1lYXMAAAQMAAAAJHRlY2gAAAQwAAAADHJUUkMAAAQ8AAAIDGdUUkMAAAQ8AAAIDGJUUkMAAAQ8AAAIDHRleHQAAAAAQ29weXJpZ2h0IChjKSAxOTk4IEhld2xldHQtUGFja2FyZCBDb21wYW55AABkZXNjAAAAAAAAABJzUkdCIElFQzYxOTY2LTIuMQAAAAAAAAAAAAAAEnNSR0IgSUVDNjE5NjYtMi4xAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAABYWVogAAAAAAAA81EAAQAAAAEWzFhZWiAAAAAAAAAAAAAAAAAAAAAAWFlaIAAAAAAAAG+iAAA49QAAA5BYWVogAAAAAAAAYpkAALeFAAAY2lhZWiAAAAAAAAAkoAAAD4QAALbPZGVzYwAAAAAAAAAWSUVDIGh0dHA6Ly93d3cuaWVjLmNoAAAAAAAAAAAAAAAWSUVDIGh0dHA6Ly93d3cuaWVjLmNoAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAGRlc2MAAAAAAAAALklFQyA2MTk2Ni0yLjEgRGVmYXVsdCBSR0IgY29sb3VyIHNwYWNlIC0gc1JHQgAAAAAAAAAAAAAALklFQyA2MTk2Ni0yLjEgRGVmYXVsdCBSR0IgY29sb3VyIHNwYWNlIC0gc1JHQgAAAAAAAAAAAAAAAAAAAAAAAAAAAABkZXNjAAAAAAAAACxSZWZlcmVuY2UgVmlld2luZyBDb25kaXRpb24gaW4gSUVDNjE5NjYtMi4xAAAAAAAAAAAAAAAsUmVmZXJlbmNlIFZpZXdpbmcgQ29uZGl0aW9uIGluIElFQzYxOTY2LTIuMQAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAAdmlldwAAAAAAE6T+ABRfLgAQzxQAA+3MAAQTCwADXJ4AAAABWFlaIAAAAAAATAlWAFAAAABXH+dtZWFzAAAAAAAAAAEAAAAAAAAAAAAAAAAAAAAAAAACjwAAAAJzaWcgAAAAAENSVCBjdXJ2AAAAAAAABAAAAAAFAAoADwAUABkAHgAjACgALQAyADcAOwBAAEUASgBPAFQAWQBeAGMAaABtAHIAdwB8AIEAhgCLAJAAlQCaAJ8ApACpAK4AsgC3ALwAwQDGAMsA0ADVANsA4ADlAOsA8AD2APsBAQEHAQ0BEwEZAR8BJQErATIBOAE+AUUBTAFSAVkBYAFnAW4BdQF8AYMBiwGSAZoBoQGpAbEBuQHBAckB0QHZAeEB6QHyAfoCAwIMAhQCHQImAi8COAJBAksCVAJdAmcCcQJ6AoQCjgKYAqICrAK2AsECywLVAuAC6wL1AwADCwMWAyEDLQM4A0MDTwNaA2YDcgN+A4oDlgOiA64DugPHA9MD4APsA/kEBgQTBCAELQQ7BEgEVQRjBHEEfgSMBJoEqAS2BMQE0wThBPAE/gUNBRwFKwU6BUkFWAVnBXcFhgWWBaYFtQXFBdUF5QX2BgYGFgYnBjcGSAZZBmoGewaMBp0GrwbABtEG4wb1BwcHGQcrBz0HTwdhB3QHhgeZB6wHvwfSB+UH+AgLCB8IMghGCFoIbgiCCJYIqgi+CNII5wj7CRAJJQk6CU8JZAl5CY8JpAm6Cc8J5Qn7ChEKJwo9ClQKagqBCpgKrgrFCtwK8wsLCyILOQtRC2kLgAuYC7ALyAvhC/kMEgwqDEMMXAx1DI4MpwzADNkM8w0NDSYNQA1aDXQNjg2pDcMN3g34DhMOLg5JDmQOfw6bDrYO0g7uDwkPJQ9BD14Peg+WD7MPzw/sEAkQJhBDEGEQfhCbELkQ1xD1ERMRMRFPEW0RjBGqEckR6BIHEiYSRRJkEoQSoxLDEuMTAxMjE0MTYxODE6QTxRPlFAYUJxRJFGoUixStFM4U8BUSFTQVVhV4FZsVvRXgFgMWJhZJFmwWjxayFtYW+hcdF0EXZReJF64X0hf3GBsYQBhlGIoYrxjVGPoZIBlFGWsZkRm3Gd0aBBoqGlEadxqeGsUa7BsUGzsbYxuKG7Ib2hwCHCocUhx7HKMczBz1HR4dRx1wHZkdwx3sHhYeQB5qHpQevh7pHxMfPh9pH5Qfvx/qIBUgQSBsIJggxCDwIRwhSCF1IaEhziH7IiciVSKCIq8i3SMKIzgjZiOUI8Ij8CQfJE0kfCSrJNolCSU4JWgllyXHJfcmJyZXJocmtyboJxgnSSd6J6sn3CgNKD8ocSiiKNQpBik4KWspnSnQKgIqNSpoKpsqzysCKzYraSudK9EsBSw5LG4soizXLQwtQS12Last4S4WLkwugi63Lu4vJC9aL5Evxy/+MDUwbDCkMNsxEjFKMYIxujHyMioyYzKbMtQzDTNGM38zuDPxNCs0ZTSeNNg1EzVNNYc1wjX9Njc2cjauNuk3JDdgN5w31zgUOFA4jDjIOQU5Qjl/Obw5+To2OnQ6sjrvOy07azuqO+g8JzxlPKQ84z0iPWE9oT3gPiA+YD6gPuA/IT9hP6I/4kAjQGRApkDnQSlBakGsQe5CMEJyQrVC90M6Q31DwEQDREdEikTORRJFVUWaRd5GIkZnRqtG8Ec1R3tHwEgFSEtIkUjXSR1JY0mpSfBKN0p9SsRLDEtTS5pL4kwqTHJMuk0CTUpNk03cTiVObk63TwBPSU+TT91QJ1BxULtRBlFQUZtR5lIxUnxSx1MTU19TqlP2VEJUj1TbVShVdVXCVg9WXFapVvdXRFeSV+BYL1h9WMtZGllpWbhaB1pWWqZa9VtFW5Vb5Vw1XIZc1l0nXXhdyV4aXmxevV8PX2Ffs2AFYFdgqmD8YU9homH1YklinGLwY0Njl2PrZEBklGTpZT1lkmXnZj1mkmboZz1nk2fpaD9olmjsaUNpmmnxakhqn2r3a09rp2v/bFdsr20IbWBtuW4SbmtuxG8eb3hv0XArcIZw4HE6cZVx8HJLcqZzAXNdc7h0FHRwdMx1KHWFdeF2Pnabdvh3VnezeBF4bnjMeSp5iXnnekZ6pXsEe2N7wnwhfIF84X1BfaF+AX5ifsJ/I3+Ef+WAR4CogQqBa4HNgjCCkoL0g1eDuoQdhICE44VHhauGDoZyhteHO4efiASIaYjOiTOJmYn+imSKyoswi5aL/IxjjMqNMY2Yjf+OZo7OjzaPnpAGkG6Q1pE/kaiSEZJ6kuOTTZO2lCCUipT0lV+VyZY0lp+XCpd1l+CYTJi4mSSZkJn8mmia1ZtCm6+cHJyJnPedZJ3SnkCerp8dn4uf+qBpoNihR6G2oiailqMGo3aj5qRWpMelOKWpphqmi6b9p26n4KhSqMSpN6mpqhyqj6sCq3Wr6axcrNCtRK24ri2uoa8Wr4uwALB1sOqxYLHWskuywrM4s660JbSctRO1irYBtnm28Ldot+C4WbjRuUq5wro7urW7LrunvCG8m70VvY++Cr6Evv+/er/1wHDA7MFnwePCX8Lbw1jD1MRRxM7FS8XIxkbGw8dBx7/IPci8yTrJuco4yrfLNsu2zDXMtc01zbXONs62zzfPuNA50LrRPNG+0j/SwdNE08bUSdTL1U7V0dZV1tjXXNfg2GTY6Nls2fHadtr724DcBdyK3RDdlt4c3qLfKd+v4DbgveFE4cziU+Lb42Pj6+Rz5PzlhOYN5pbnH+ep6DLovOlG6dDqW+rl63Dr++yG7RHtnO4o7rTvQO/M8Fjw5fFy8f/yjPMZ86f0NPTC9VD13vZt9vv3ivgZ+Kj5OPnH+lf65/t3/Af8mP0p/br+S/7c/23////uAA5BZG9iZQBkQAAAAAH/2wCEAAICAgICAgICAgIDAgICAwQDAgIDBAUEBAQEBAUGBQUFBQUFBgYHBwgHBwYJCQoKCQkMDAwMDAwMDAwMDAwMDAwBAwMDBQQFCQYGCQ0KCQoNDw4ODg4PDwwMDAwMDw8MDAwMDAwPDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDAwMDP/AABEIAEwAZAMBEQACEQEDEQH/3QAEAA3/xAGiAAAABwEBAQEBAAAAAAAAAAAEBQMCBgEABwgJCgsBAAICAwEBAQEBAAAAAAAAAAEAAgMEBQYHCAkKCxAAAgEDAwIEAgYHAwQCBgJzAQIDEQQABSESMUFRBhNhInGBFDKRoQcVsUIjwVLR4TMWYvAkcoLxJUM0U5KismNzwjVEJ5OjszYXVGR0w9LiCCaDCQoYGYSURUaktFbTVSga8uPzxNTk9GV1hZWltcXV5fVmdoaWprbG1ub2N0dXZ3eHl6e3x9fn9zhIWGh4iJiouMjY6PgpOUlZaXmJmam5ydnp+So6SlpqeoqaqrrK2ur6EQACAgECAwUFBAUGBAgDA20BAAIRAwQhEjFBBVETYSIGcYGRMqGx8BTB0eEjQhVSYnLxMyQ0Q4IWklMlomOywgdz0jXiRIMXVJMICQoYGSY2RRonZHRVN/Kjs8MoKdPj84SUpLTE1OT0ZXWFlaW1xdXl9UZWZnaGlqa2xtbm9kdXZ3eHl6e3x9fn9zhIWGh4iJiouMjY6Pg5SVlpeYmZqbnJ2en5KjpKWmp6ipqqusra6vr/2gAMAwEAAhEDEQA/APv5irsVY9rvmrQfLkfLVb9IZSKx2i/HM3hRFqaHxNB74QLRbxvWfzsmJePQtJSNP2bm9Ysx/wCecZAH/BHJcKOJ5xqH5mec74ktrktsh6R2yrCB8igDfecPCEWxG58x65cEmfWr6YnqXuJG/W2GlS463qqGqandIfFZnB/XhpUZbee/N9gf9F8y6igG4Rrh5F/4Fyw/DBQW2ZaX+e/nLTyq3/1TWoR9r14hFJT2eHgK/NTg4Qm3sHlv89vKOsNHb6sJPLl49BW4IktiT2EygU+bqo98iYlNvaIZobmKO4t5UngmUPDNGwZHU7gqwqCD7ZFKrirsVf/Q+/hNNzsB1OKvBvPH5rGJ5tK8ryqSlUudYoGFe4gB2/2R/wBj2OTEWJL5/ubua4lknuJnnmlYtLNIxZmY9SzGpJyTFL3l98UoN5KnbcnphVken+R/OWsKr2Hl28eJ/sTSp6CMPEPKUU/fgsLTJYvyS8+zir29la1/ZluVJ/5Jh8HEE06X8iPPdCVk0x/8kXD1/GMY8QWmP3/5M/mNaKXXRFvFXqbe5hY/QpdWP0DDxBaeaazoeu6E/p6zo95pbE0U3MLxq3+qzAA/QcIKp35L/M3zJ5FuVbTbo3OmM/K70W4JaCQH7RUf7rY/zL7VqNsTG1fdXkjz1ofn3SRqejy8ZYqJqOnSEetbSEfZcDqDT4WGx+YIFRFMmZ4Ff//R+xv5t+cpNPiXy1p0vC4u4+eqTKd1hb7MYPi/U+3zyUQxJfNTy++TYoR5ffCr0fyR+WOr+bgl/dOdK0Ina7ZayT06iFDTbtyO3hyoRkTKmQD6a8veRvLHlhEOmaXH9aQCuozgS3BPj6jD4a+C0HtkCbTT5S86/wDOcv5f+R/N3mTyfqHlDzDd3vlnUbjTbq6t/qnpSPbuUZk5zK1CRtUZ2Wj9itTqcMM0ckAJgHe+vweZ1PtTgwZZYzCRMSR06fFi3/RRD8sv+pI8z/dZf9lGZH+gHVf6pD7f1NH+jDT/AMyX2frWn/n4n+WQ/wCmH8z/APTl/wBlGP8AoB1X+qQ+39S/6MNP/Ml9n61p/wCfiv5Yj/ph/M//AE5f9lGP+gLVf6pD7f1L/ow0/wDMl9n61a3/AOfhP5Oai5sdZ8neZrawuBwmkkt7K5jof9+R/WQSPkD8srn7CayIuM4E+8j9DOHtdpiaMZD5frZbb6J+TH57aZea1+Svmixi120T1bzy+vO3pU0/fWcyrLACfhV0X0yeleuc5ruzNVoJVngY3yPMH3EbfDm73R9oafWC8UgfLqPhzeL+XfMvmP8AK3zf9YMEtnf6bMbbWdJl+ETRVHqRP1BBG6sKitGFcwiLDmP0X/xdof8AhP8Axp9a/wBwP1D9I+vQcvS48uPGv26/Dxr9rbKa3pk//9L6HeadWfVvMGsag7cvrN3IU9kVuKD6FAGWgMGLvL74VZ3+WnlRPN/mRILtSdK05PrOpDpzAICRV/yz19gcEjSQH2xHHHDHHFFGsUUShIokAVVVRQAAbAAZUyX4q/nk/wCcgz/yHD82R/39Wqf9RD5732F/iGD+pH7nyDtf/HMv9c/e8aY/dm1dcpMcVUSfvwJUif7cCp35Y81+YPJWv6Z5o8rarPouuaRMJrG/t24srDqrDoysKqysCrAkMCDlGp02PUYzjyASieYP4+1twZ54JicDUh1frJ5217T/AM3/AMofIH556faR2WqX6/orzbaQ/ZS5iLxt13ossbBSdyjp4Z4d2poDoNVPAdwDse8HcfjvfW+zdYNZp45ep5+8c0g/x3d/8qS/wh6x/wCUi4dT/vH6X1n0/wDkf8Wa+t3Of//T94azFJY6rqdlKCstndTQyKexRyp/VlwYJG8vvir6T/5x4lgZPNcdR9Z5WbHxKUmH4HITZB9K5BLsVfzv/wDOQh/5Dj+bP/gVap/1EPnvXYX+IYP6kfufIO1/8cy/1z97xonNs65+0f8Azhd5L8na3+QXl2/1nyno2r30mo6mr3l7YW88pC3TgAvIjMaAUG+eQ+12szY+0ZxhOQFR2BI6PpPs3psU9FEygCbPMA9X1Bf/AJS/lbqdnc2F9+XPlq4tLtDHPEdKtBUEU2ZYwVI7EEEHcb5zcO1NXCQlHLMEf0j+t3k9Bp5CjjjR8g/nv/Nzy9o3lH8z/P8A5X8uzGbQtA16+sdLYv6hWGCZkVC/7RSnEnuRnuPZmonn0uPJk+qUQT7yHybX4YYdRkhD6YyIHzebs39mZziP1E/Iv1If+cKvMbXdQtz5vc6Zy7qJbMHj9KSfjnkftoQe0RX8wfpfSvZQH8kb/nH9CWfoW7/5Vn/ib0m+p/4l+oepQ05fVPUr8u1fHOWvd6R//9T6h/nj5Um0vWV8zWsROnayQt2yjaK6UUNf+Miio9+WWRLEh8/vLkkMx/Lvzu3knzNbanIGk024X6tq0K7kwOQSyj+ZCAw8enfARaQ+/bC/s9Us7bUNPuY7yyvIxJbXMZqrqehBypki8Vfzt/8AOQp/5Dl+bX/gVap/1EPnvXYX+IYP6kfufIO1/wDHMv8AXP3vGGb782rr3uPkb/nJb86Py18uWvlPyX5wGj6BZyzTW9l9QsJ+LzuXkPqT28jmrGu7bds0ut9n9DrMpy5ocUj1uQ5e4u00vbOr02MY8c6iPIH7wnup/wDOYn/OR2qWNzp8/wCZVzbwXSGOWWzsrC0nAO3wTwWySxn3RgffMfH7K9mwkJDELHeZEfImj8W2ftDrpijkO/cAPtAt8ySyvK7yyu0kkjFndiSzMdyST1JzfjbYOmJtlfkLyF5q/MzzRp3lDydpcmq61qT0VFBEcEQIDzzyUIjjStWY/LqQDia3W4tHiOXKaiPt8h3lyNLpcmpyDHjFk/iz5P1U/MTSrHyT5P8Ay2/5xt8jsdZvtC9KTXXgA5XGpXHJqEDoZJJnkIJ+EFN9s8R1+tlrdRPPL+I7eQ5AfAPreh0kdJgjij/CPmev2vqn/lTll/ypr/lWfqR/XfqnrfpCh4/pPl63q168fU+Hx4bZruLe3Mf/1fvVq+k6frum3ek6pbrdWN6hjnib7wQeoIO4I6HFXwr+Y35aa15FuZLgI+oeXpXpZ6sg+xU7RzgfYbtXo3beoFolbGnkjy++SQzzyN+avmPyDPwsZBf6PK/K60W4J9Jj3aNhvGxHcbH9oGgwGNpt9c+U/wA8vIfmdYoZ9RHl7UnoGsdSIjUsf5J/7thXYVIJ/lysxIZB+Gv/ADkFNHL+eH5syROJI381aoUdTUEG4ehB7g9s947C/wAQwf1I/c+Qdrf45l/rn73jZObR172Xyf8A847/AJ0fmB5etPNfk/yLc635fv3mS01GK5tEDtbuY5AElnRxRlI3Xftmo1fbui0uQ4suQRkK2o9fg7LT9karUQGTHAmJ62OnxeP6tpmpaHqV9pGs2Fxpeq6bM9tqGm3UbRTQSxmjJIjgFSD1BGbLHkjkiJQIIO4I5EOvnCUJGMhRHMJ35K1XybpOtJc+efKt35v0Qrxk0yy1E6ZKGqPjEwhmrQfs0Ff5h1yjV4804VhmIS7yOL7LDdpp4oTvLEyj3A8P6C/ULyN+en5cReVofKf/ADiz+Xb6FrGqenBrDS24k1KGdlJUPVp5LlgCSsskjIoB2O9PIPaHT67FnA1suK94n+Ejrw8q8xQL6d2Hl0eXCTpY8NfUP4genF3+Rsh9Qfkp+SUnkmSXzh5wnGq+e9TDu7s/rLZCapkAkJPqTPU+pJXxVSRVm5+Ur5O5fR2QV//W+/mKqU8ENzDLb3MKXFvOpSaCRQ6OrChVlNQQR1BxV86edP8AnHbRdXaa+8p3n+H7x6sdOlDSWbMf5SKvFU+HIdgoyYminzF5m/Kn8wfLLSNfeXbm6tY6/wCn2A+tQlR+0TFVkH+uFyYkCinl0jsjlHBVlNGVhQgjqCMkr4T88OW86+biTUnVrip/2We59h/8Z+n/AOFxfIu1/wDHc39csUZvuzZOvfef5Gfm7+YPlb8q9B0LQPMUmm6ZbXN+0NukFuxBluXdvjeJnPxMe+eO+18Qe1Mnuj/uQ+oezH/GfD3y+8vLPz70nzV589b8z54LvWr/AEuKK182alHBVRarRIJ5TEgUGMkISf2Svhm59iu1vDmdHkO0vVDyl/FH3S5jzvvdX7WdmcUBqoDcbT8x0l8OR8vc+Tyc9HeDe7/842/nPP8Akf8AmlpPmqTlJ5d1Bf0V5wtlXmz6dM6s7oOvOFlWRabnjx6Mc0vb3ZY7R0px/wAQ3j/W/UeR+fR2nY/aB0OoE/4TtL3fs5/2v6JLG9tNSsrPUdPuY7yw1CCO5sruJg0csMqh43RhsQykEHPEJwMJGMhRGxfWYyEgCNwUVkWT/9f7+Yq7FXYq7FUk1Py15d1qv6Y0HTtVJ6m7topj97qTjav53vz7s7TTfzr/ADWsbGBLWztvNOpxwW8YoqItw4VVHYACgz3jsM/4Bg/qR+58g7X/AMcy/wBc/e8hJzauvft1/wA4S+SvKGofkB5Q1jUPLOmahqst5qvPULq1inl+G/mVaPIrEUCgCmeM+2B/1zye6P8AuQ+oezP+IQHnL7y+x9W8vaLreg6l5Z1LTobjQtXtJrG/03gFie3nQpInEUAqCemc5hzSxTE4GpRNg+Yd5lxxyQMJCwRRfzg/nV+WGp/k9+ZHmTyHqReWLTJ/U0e/cAfW7Cb47afbarIQGA6OGXtnuvZXaMdfpo5o9RuO6XUfjo+Q9o6KWjzyxHpy8x0P46vJ2bNg4L9g/wDn35+e/wDiDQbn8l/Ml7y1jyzE935MllPxT6byrLagk7tbs3JR/vs0G0eeY+2fZHhZBqsY9MtpeUuh+P3+97/2W7T8SH5eZ3jvH3d3w+73P0szhHsH/9D7+Yq7FXYq7FXYq/nv/P3/AAf/AMrv/Nn6/wDpn6z/AIq1P1Pq/wBX9Ovrtypy3pyrT2z3DsXxvyOHh4a4I9/c+T9q+F+by3f1Hu73j5/wH/2v/wDp1zZf4R/R+1wP3P8AS+x+4P8AzhP9Q/6F28n/AKN+sfVPreren9a4+rX9IT1rw2655D7W8X8oz4quo8v6ofSvZyvyMOHlZ+8vq/Obd6/Lb/n4z/yrj6z+W/6X+t/444XX/HP9P1P0RXb1/U2p69fS/wCeuehew/5msvDXh7c/53l8OfweK9rfAvHxXx78v5vn8eXxfmIf8Bf9r/8A6dc739//AEfteN/c/wBL7Ho/5O0/5Wl5F/5Vh/iD/Hn6Xt/8P1+q+nz5fvfW7el6XP1K7cOVdq5gdqf4rk/McPh8Jvn9nnfLzczs/wDxiHg8XHe3L8VXPyf0e54e+tv/2Q==\",\"index\":0},\"iconSize\":[[25,19]]},null,null,{\"interactive\":true,\"draggable\":false,\"keyboard\":true,\"title\":\"\",\"alt\":\"\",\"zIndexOffset\":0,\"opacity\":1,\"riseOnHover\":false,\"riseOffset\":250},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[-39.04560029769151,-35.72534686878304],\"lng\":[173.4338079809993,177.2567496719338]}},\"evals\":[],\"jsHooks\":[]} # circle (units in metres) m %>% addCircles(rand_lng(50), rand_lat(50), radius = runif(50, 50, 150)) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircles\",\"args\":[[42.04118504738695,42.0256989560957,42.03761053989658,42.0485439453989,42.03097140421073,42.02420923906185,42.00666244878454,42.02726365103967,42.031373838787,42.02478400731165,42.04476562257072,42.03159908346014,42.01285959335932,42.01619376534975,42.01479802517896,42.0295655580483,42.02451174508039,42.02496593870066,42.03084501126212,42.04619789883558,42.03307876384229,42.03993758111794,42.01542277379194,42.01907450398878,42.02755038749183,42.01719953026272,42.01393791963352,42.01151282485538,42.01609173309476,42.01791700950565,42.02095621432708,42.02264893057676,42.03408142081494,42.02830993417191,42.02680643975616,42.04145330716166,42.01423940004197,42.04604103727082,42.00734424731192,42.03859702424425,42.03104535083008,42.02472445870784,42.03222469256622,42.01387318889537,42.03753709291824,42.02284445003706,42.02570248930685,42.04009675299442,42.02727913496103,42.02252142735843],[-93.66937313887567,-93.64109637302742,-93.65112423111796,-93.65224072408583,-93.66283825031186,-93.66342499016994,-93.66070571510903,-93.66552867101456,-93.65493495109065,-93.64761679114466,-93.64972581626884,-93.64771146289614,-93.65069811729082,-93.64038275022233,-93.64579992674997,-93.65384825945657,-93.671557429167,-93.6630964531638,-93.64574191654903,-93.66527475419839,-93.65075326634312,-93.66724481024896,-93.64687616512069,-93.65557059748197,-93.66112549886184,-93.6432659860078,-93.65001044417319,-93.66149541691313,-93.64035771427224,-93.64594144522545,-93.65509258780739,-93.65917171363408,-93.64616736664502,-93.63967017934021,-93.64869478600014,-93.64110166036663,-93.65672486250088,-93.64925014703617,-93.62698720352748,-93.64967244916005,-93.65069560797646,-93.64484378006317,-93.63607033455025,-93.63981436828769,-93.6494698944272,-93.64419725246965,-93.65594179494299,-93.65371855337753,-93.66423035199885,-93.6614048381664],[78.06568304076791,68.93211116548628,104.7432707622647,71.25135480891913,113.7151221977547,68.77734777517617,94.08672254066914,88.40627197641879,117.37618339248,68.76332280226052,89.64051802176982,103.9464476983994,124.6747818542644,126.4405827736482,147.6377381477505,134.1458254028112,77.775515220128,120.1250159181654,116.2139775929973,137.7708123996854,111.0746057704091,106.872813613154,52.27500174660236,121.8340002931654,115.6661416403949,95.38228197488934,141.3841662928462,131.7140431376174,131.8184578325599,99.33831670787185,76.13777990918607,67.81867318786681,92.00866417959332,64.45462454576045,103.5692346747965,53.69526075664908,136.2576556857675,64.30871449410915,68.74506573658437,62.92741047218442,141.6686865035444,115.0721014244482,109.8848532419652,139.8004586109892,81.79975005332381,54.98697522561997,121.0799474501982,95.08143833372742,106.6425233380869,66.56146738678217],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null,null]}],\"limits\":{\"lat\":[42.00666244878454,42.0485439453989],\"lng\":[-93.671557429167,-93.62698720352748]}},\"evals\":[],\"jsHooks\":[]} # circle marker (units in pixels) m %>% addCircleMarkers(rand_lng(50), rand_lat(50), color = \"#ff0000\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.03946635786205,42.04423426297234,42.03288906404404,42.02576153535955,42.03466221192998,42.02500030975305,42.03594181871352,42.01812115353374,42.01869579667493,42.01412334210437,42.02753386798638,42.02863212847178,42.02964593809743,42.04516272853054,42.02313496112895,42.04274024145383,42.0361846891379,42.03703083437098,42.0237461786521,42.02599125001583,42.02787956745635,42.03395192481936,42.03415842529349,42.01896133921827,42.02207319881965,42.03188814432313,42.02530126646926,42.01884855455839,42.01588977763138,42.04440902192393,42.02662555556533,42.0299342103505,42.02648979494051,42.03550592266395,42.01267463464795,42.03310625635562,42.02222552331378,42.04223965697321,42.02225861626528,42.0009972279664,42.02670170884879,42.01753642937315,42.03802928890393,42.02188969994155,42.05141207061222,42.03269176381549,42.03431516889857,42.02643725099102,42.02748772833064,42.01734758967195],[-93.65254902841257,-93.64430422932153,-93.6570545846247,-93.65200650026348,-93.66379594726838,-93.63568431771144,-93.64363732970774,-93.64581756180711,-93.64666026071778,-93.64085163989151,-93.65648525255611,-93.6558381751129,-93.63882915987506,-93.65229160401427,-93.65627103916168,-93.6291426153964,-93.65252181282814,-93.63723453102557,-93.65413556031783,-93.64429729703605,-93.64566027338677,-93.64462018810859,-93.6546463062607,-93.63785710578593,-93.64338051084825,-93.65925800297747,-93.65778266018414,-93.64093781995349,-93.6421832513434,-93.65257065264505,-93.66198556198819,-93.66035120660224,-93.65563871058536,-93.65976150405669,-93.66664477774114,-93.63695709729708,-93.66202279262676,-93.64090005796812,-93.65122059275177,-93.64905915510415,-93.63670824073226,-93.63857694158541,-93.64732885826845,-93.64375299085437,-93.66570581528498,-93.63726020348038,-93.65649271780273,-93.63270427254739,-93.65110558501327,-93.66730261723593],10,null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#ff0000\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#ff0000\",\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.0009972279664,42.05141207061222],\"lng\":[-93.66730261723593,-93.6291426153964]}},\"evals\":[],\"jsHooks\":[]}m %>% addCircleMarkers(rand_lng(100), rand_lat(100), radius = runif(100, 5, 15)) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.03139382301159,42.03131457072642,42.01227352436597,42.03104176426201,42.04190461182773,42.02736887199652,42.03153450133026,42.03589178037707,42.03283381042127,42.04045457350151,42.01690151628789,42.03324406738251,42.02583754240751,42.03678473726934,42.03701016791823,42.02749145896812,42.02325699379563,42.00191744490117,42.02806289482762,42.02349636696815,42.02588686782479,42.03820117195004,42.01534267103118,42.04284004284053,42.02713297963835,42.01020835737707,42.0300710896609,42.02548970451941,42.01441370800854,42.02283630873292,42.0451916697922,42.02723652685268,42.04055623359034,42.02754042799931,42.01815255702064,42.03348846726976,42.03062249499183,42.02378441899302,42.04643346593294,42.03500836713697,42.0224450072994,42.03826492097145,42.0234422801148,42.04204956305226,42.02524658817892,42.04201890213911,42.03748629390856,42.0214492746506,42.03604731199234,42.044965012277,41.99598647555202,42.02199009409272,42.02527626116924,42.03714508267493,42.03105943154083,42.01186943298647,42.02129363851798,42.03100080542538,42.01331798760197,42.03297007895823,42.03750320899652,42.03109821487963,42.03867965689039,42.03464271349885,42.02610591988064,42.01046850719147,42.02863425676254,42.02782671313301,42.04528755418297,42.02598542787371,42.01994751122161,42.02879318304911,42.02497910512447,42.01481954835298,42.03334613390476,42.0214962298734,42.0268512107045,42.03308015157729,42.03219496335166,42.03664652993615,42.02417714955119,42.04004377044308,42.04365261449227,42.03067893525224,42.03190447641499,42.04143091855217,42.04456693041365,42.02376496017807,42.03194269175073,42.01754210638398,42.0388615023908,42.03141469314912,42.01519944188558,42.04049611607736,42.02719664819917,42.02420001013732,42.01903171286035,42.01873051530971,42.03106106771453,42.03352862702666],[-93.65535611192416,-93.64498900814321,-93.64963480212587,-93.64541131211486,-93.66521969877439,-93.65442283180555,-93.66773276869181,-93.64461048057697,-93.64277675367762,-93.64417042308612,-93.64462646648929,-93.64714430273224,-93.66482057456456,-93.62536381217032,-93.64868206977155,-93.65252806462894,-93.64008948950905,-93.66338089776762,-93.63864157127118,-93.64943604632572,-93.64961894889667,-93.65430235214177,-93.65553782493306,-93.66708852809485,-93.65554707049687,-93.64220326843139,-93.64579162342447,-93.65583530064413,-93.6413696980473,-93.66049878387568,-93.66376696316098,-93.64521295982385,-93.6511379976028,-93.65602881765466,-93.65629993268512,-93.65345159402762,-93.64964639104949,-93.67973885881058,-93.66566146013689,-93.63524243415587,-93.64457010861922,-93.66048817881108,-93.65617483221058,-93.65554655207391,-93.64821705008474,-93.64172455253075,-93.63865009614665,-93.64437720901238,-93.6320981242151,-93.65306880223694,-93.65841409786624,-93.6539766978739,-93.65243537341044,-93.64317030372932,-93.6413748725688,-93.65040741918902,-93.64141362303553,-93.66162152117245,-93.6468268336809,-93.66212990119476,-93.64844374414152,-93.65862042388578,-93.65349729267643,-93.65586681455501,-93.65849060725076,-93.64410307000117,-93.64332756587662,-93.63895947704735,-93.66149450995327,-93.65453019857799,-93.6276107518126,-93.65304553953214,-93.65319894764986,-93.64595756520723,-93.64704301884834,-93.64872819322476,-93.64839147993828,-93.6443842861557,-93.64924220526122,-93.63776198017885,-93.64422654019363,-93.66858473531995,-93.65727858218989,-93.65265113988491,-93.64287777896372,-93.64901357249778,-93.6484548025275,-93.65860153676819,-93.63499374394719,-93.65251282933164,-93.65032197216577,-93.65151554267761,-93.63498382525141,-93.64388572763998,-93.64834841350275,-93.66902026286084,-93.66752261966002,-93.6747583432476,-93.65208157174324,-93.64523303428503],[10.29429597081617,8.622156181372702,13.05342986481264,12.3296674201265,7.343654199503362,11.60355402622372,5.328561237547547,9.604916137177497,10.95951206749305,9.222959498874843,5.787752650212497,12.32753598829731,5.417331401258707,9.810585284139961,8.545346057508141,6.366096960846335,11.39315407257527,12.25025215884671,14.54391124425456,7.089333012700081,9.044184705708176,12.93640323914587,9.68192977597937,13.65355333779007,13.84180626831949,14.22194473212585,11.50977266021073,11.92100784741342,14.66504436451942,5.981152725871652,6.663144568447024,12.93203699402511,6.112266723066568,7.416913681663573,9.038710205350071,8.590880089905113,14.15660251863301,7.47517763171345,12.60489414678887,6.278453792911023,5.214693432208151,7.863010682631284,7.108870267402381,5.886595482006669,9.308966270182282,7.575619416311383,11.94229549495503,5.050908429548144,12.25495903287083,11.29896911559626,14.26709386520088,11.94528787396848,14.17119325371459,8.095572907477617,13.25382635463029,6.72485240502283,13.59619680093601,6.16149102570489,7.927293421234936,14.11753519205377,9.054653272032738,7.696460611186922,13.34075686056167,7.524813553318381,12.02279969118536,5.980837971437722,11.11713781021535,12.94667060952634,7.938313740305603,14.98685538070276,10.60312955873087,13.68481491692364,11.50048445211723,5.0238775042817,14.5818458031863,14.47091881651431,14.87428131978959,11.96311163716018,14.76428579539061,11.92443791544065,14.71561374608427,7.310809656046331,10.54241922916844,6.33819046895951,8.239021063782275,12.63330595334992,6.595519778784364,11.57576124882326,10.36680360324681,5.669132708571851,11.69581747846678,6.105556406546384,6.688631461001933,14.22971677966416,14.89287599921227,12.03842387301847,5.979038719087839,8.159251769538969,6.166858170181513,12.60761911282316],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[41.99598647555202,42.04643346593294],\"lng\":[-93.67973885881058,-93.62536381217032]}},\"evals\":[],\"jsHooks\":[]} # rectangle m %>% addRectangles( rand_lng(), rand_lat(), rand_lng(), rand_lat(), color = \"red\", fill = FALSE, dashArray = \"5,5\", weight = 3 ) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addRectangles\",\"args\":[[42.03531386076063,42.02008068719508,42.02348698610535,42.01592188867964,42.04931183395641,42.01853728233499,42.01503181750024,42.01928660661697,42.05874370932054,42.05413573651914],[-93.64293487516746,-93.67933758790726,-93.65258555683351,-93.66069520490615,-93.63933621063865,-93.65639754058024,-93.651123361751,-93.64421632687144,-93.65026220920639,-93.66138633722051],[42.05240643815082,42.02153420947384,42.03707869527642,42.0420269253829,42.03095758984068,42.03656324691026,42.02109975245402,42.02245546555657,42.03703258551537,42.02009825834853],[-93.63997864861673,-93.64311041241332,-93.64682034965479,-93.66862551419028,-93.65563477648162,-93.64183080010871,-93.66132326778798,-93.6465048692109,-93.65167182641599,-93.65037946950673],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"red\",\"weight\":3,\"opacity\":0.5,\"fill\":false,\"fillColor\":\"red\",\"fillOpacity\":0.2,\"dashArray\":\"5,5\",\"smoothFactor\":1,\"noClip\":false},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.01503181750024,42.05874370932054],\"lng\":[-93.67933758790726,-93.63933621063865]}},\"evals\":[],\"jsHooks\":[]} # polyline m %>% addPolylines(rand_lng(50), rand_lat(50)) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addPolylines\",\"args\":[[[[{\"lng\":[-93.652972983574,-93.63956634639858,-93.67655064558004,-93.6514601148437,-93.64887840737111,-93.64656062246287,-93.63712290871597,-93.64102274900146,-93.64637872866817,-93.64894310246346,-93.65131956158362,-93.63932149756748,-93.64074737459669,-93.63676148920567,-93.63965778350186,-93.64852112370453,-93.64664276978237,-93.65644610970732,-93.66045565709707,-93.66368633466951,-93.65507365184034,-93.64857239632845,-93.65522575471802,-93.65218278601664,-93.66198830265246,-93.64712614308557,-93.63903263047496,-93.65694464715423,-93.66355603226674,-93.65252509665768,-93.65026414224634,-93.6377214099622,-93.64179166928103,-93.6486308304587,-93.63895571127897,-93.65934792887226,-93.65318536676949,-93.63817978608303,-93.6489318602445,-93.66172871016238,-93.63987690168837,-93.64406172268818,-93.66004868391832,-93.63750815308495,-93.65130497574164,-93.64842143788051,-93.63109990353027,-93.64374026886168,-93.66685038000773,-93.62750228037102],\"lat\":[42.02489662778101,42.04565054180035,42.0220669195108,42.02634634383799,42.03367537296126,42.03741485412495,42.03305866409079,42.01885444659105,42.02520085207016,42.03479722358253,42.03020567893518,42.02773406857008,42.02570992705288,42.03055933088892,42.03201860468176,42.03748994224257,42.01896972726991,42.03500050778156,42.02186223827843,42.04204757292183,42.0198254383831,42.02901292616725,42.04426029572173,42.03825416795208,42.03621690633857,42.0274500370836,42.02081060718391,42.03920701340228,42.02670127619658,42.01757369299568,42.00902923859864,42.01328420800149,42.02695876555808,42.03736219339599,42.01430741138624,42.0324320931384,42.01998158202134,42.03578167189465,42.04566373175746,42.024524205981,42.02872869686823,42.04292693014155,42.01965415018971,42.05156736581608,42.02752365574212,42.02337214412228,42.02711853281946,42.04153417458208,42.026149573937,42.03395335678854]}]]],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":false,\"fillColor\":\"#03F\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00902923859864,42.05156736581608],\"lng\":[-93.67655064558004,-93.62750228037102]}},\"evals\":[],\"jsHooks\":[]} # polygon m %>% addPolygons(rand_lng(), rand_lat(), layerId = \"foo\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addPolygons\",\"args\":[[[[{\"lng\":[-93.66230733512604,-93.66362211464309,-93.65235880551107,-93.66249257449554,-93.63673320543423,-93.65709752194779,-93.64162963152377,-93.64937000329466,-93.65120490794359,-93.63382183031048],\"lat\":[42.04073450951627,42.02861734752911,42.03184055284404,42.01785872494543,42.03124030624387,42.02481425625695,42.0239277901462,42.03580823221426,42.02892499982967,42.00378646313765]}]]],\"foo\",null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false},null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00378646313765,42.04073450951627],\"lng\":[-93.66362211464309,-93.63382183031048]}},\"evals\":[],\"jsHooks\":[]} # geoJSON seattle_geojson <- list( type = \"Feature\", geometry = list( type = \"MultiPolygon\", coordinates = list(list(list( c(-122.36075812146, 47.6759920119894), c(-122.360781646764, 47.6668890126755), c(-122.360782108665, 47.6614990696722), c(-122.366199035722, 47.6614990696722), c(-122.366199035722, 47.6592874248973), c(-122.364582509469, 47.6576254522105), c(-122.363887331445, 47.6569107302038), c(-122.360865528129, 47.6538418253251), c(-122.360866157644, 47.6535254473167), c(-122.360866581103, 47.6533126275176), c(-122.362526540691, 47.6541872926348), c(-122.364442114483, 47.6551892850798), c(-122.366077719797, 47.6560733960606), c(-122.368818463838, 47.6579742346694), c(-122.370115159943, 47.6588730808334), c(-122.372295967029, 47.6604350102328), c(-122.37381369088, 47.660582362063), c(-122.375522972109, 47.6606413027949), c(-122.376079703095, 47.6608793094619), c(-122.376206315662, 47.6609242364243), c(-122.377610811371, 47.6606160735197), c(-122.379857378879, 47.6610306942278), c(-122.382454873022, 47.6627496239169), c(-122.385357955057, 47.6638573778241), c(-122.386007328104, 47.6640865692306), c(-122.387186331506, 47.6654326177161), c(-122.387802656231, 47.6661492860294), c(-122.388108244121, 47.6664548739202), c(-122.389177800763, 47.6663784774359), c(-122.390582858689, 47.6665072251861), c(-122.390793942299, 47.6659699214511), c(-122.391507906234, 47.6659200946229), c(-122.392883050767, 47.6664166747017), c(-122.392847210144, 47.6678696739431), c(-122.392904778401, 47.6709016021624), c(-122.39296705153, 47.6732047491624), c(-122.393000803496, 47.6759322346303), c(-122.37666945305, 47.6759896300663), c(-122.376486363943, 47.6759891899754), c(-122.366078869215, 47.6759641734893), c(-122.36075812146, 47.6759920119894) ))) ), properties = list( name = \"Ballard\", population = 48000, # You can inline styles if you want style = list( fillColor = \"yellow\", weight = 2, color = \"#000000\" ) ), id = \"ballard\" ) m %>% setView(-122.36075812146, 47.6759920119894, zoom = 13) %>% addGeoJSON(seattle_geojson) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addGeoJSON\",\"args\":[{\"type\":\"Feature\",\"geometry\":{\"type\":\"MultiPolygon\",\"coordinates\":[[[[-122.36075812146,47.6759920119894],[-122.360781646764,47.6668890126755],[-122.360782108665,47.6614990696722],[-122.366199035722,47.6614990696722],[-122.366199035722,47.6592874248973],[-122.364582509469,47.6576254522105],[-122.363887331445,47.6569107302038],[-122.360865528129,47.6538418253251],[-122.360866157644,47.6535254473167],[-122.360866581103,47.6533126275176],[-122.362526540691,47.6541872926348],[-122.364442114483,47.6551892850798],[-122.366077719797,47.6560733960606],[-122.368818463838,47.6579742346694],[-122.370115159943,47.6588730808334],[-122.372295967029,47.6604350102328],[-122.37381369088,47.660582362063],[-122.375522972109,47.6606413027949],[-122.376079703095,47.6608793094619],[-122.376206315662,47.6609242364243],[-122.377610811371,47.6606160735197],[-122.379857378879,47.6610306942278],[-122.382454873022,47.6627496239169],[-122.385357955057,47.6638573778241],[-122.386007328104,47.6640865692306],[-122.387186331506,47.6654326177161],[-122.387802656231,47.6661492860294],[-122.388108244121,47.6664548739202],[-122.389177800763,47.6663784774359],[-122.390582858689,47.6665072251861],[-122.390793942299,47.6659699214511],[-122.391507906234,47.6659200946229],[-122.392883050767,47.6664166747017],[-122.392847210144,47.6678696739431],[-122.392904778401,47.6709016021624],[-122.39296705153,47.6732047491624],[-122.393000803496,47.6759322346303],[-122.37666945305,47.6759896300663],[-122.376486363943,47.6759891899754],[-122.366078869215,47.6759641734893],[-122.36075812146,47.6759920119894]]]]},\"properties\":{\"name\":\"Ballard\",\"population\":48000,\"style\":{\"fillColor\":\"yellow\",\"weight\":2,\"color\":\"#000000\"}},\"id\":\"ballard\"},null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2,\"smoothFactor\":1,\"noClip\":false}]}],\"setView\":[[47.6759920119894,-122.36075812146],13,[]]},\"evals\":[],\"jsHooks\":[]} # use the Dark Matter layer from CartoDB leaflet() %>% addTiles(\"https://{s}.basemaps.cartocdn.com/dark_all/{z}/{x}/{y}.png\", attribution = paste( \"© OpenStreetMap<\/a> contributors\", \"© CartoDB<\/a>\" ) ) %>% setView(-122.36, 47.67, zoom = 10) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.basemaps.cartocdn.com/dark_all/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a> contributors © CartoDB<\\/a>\"}]}],\"setView\":[[47.67,-122.36],10,[]]},\"evals\":[],\"jsHooks\":[]} # provide a data frame to leaflet() categories <- LETTERS[1:10] df <- data.frame( lat = rand_lat(100), lng = rand_lng(100), size = runif(100, 5, 20), category = factor(sample(categories, 100, replace = TRUE), levels = categories), value = rnorm(100) ) m <- leaflet(df) %>% addTiles() m %>% addCircleMarkers(~lng, ~lat, radius = ~size) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.0275439469367,42.02850856687817,42.02471710192324,42.03856490439633,42.02617552024589,42.02185988769047,42.03201242237268,42.02156836879088,42.00071745929274,42.03982404542268,42.01845138245503,42.0145462442034,42.02713285607175,42.03331993717762,42.03942914269688,42.01528218729826,42.03905582360974,42.02689046633677,42.02676699091157,42.02558251597001,42.05096668795214,42.032210951063,42.04086263070892,42.03730671421407,42.03781360320225,42.04218406398204,42.01310542696795,42.02988470783713,42.01024712620395,42.0395379742443,42.03621371549353,42.03759148573567,42.03239579190152,42.03092304970755,42.04000764170451,42.02385331692301,42.00497694162157,42.03345846489503,42.01822184158728,42.03690247746567,42.03492905051364,42.02329699643625,42.02304686530763,42.02930893183068,42.02481924587406,42.03304851136662,42.02572835523341,42.03253167147148,42.02858137871883,42.02493229196173,42.03344554007207,42.03885993007018,42.03453662331968,42.02896697574077,42.03440326830454,42.03153373039122,42.02998154371434,42.03839726794725,42.03000786056483,42.03228592948875,42.02456909646138,42.02140617683165,42.00931476024424,42.02776970753985,42.02058487732943,42.0385882223591,42.04442791183199,42.04104362241481,42.04056039863206,42.01900940574943,42.01885203526652,42.02791607640876,42.02520478385033,42.01998555810211,42.02348692232571,42.03493010366306,42.04210181811401,42.04162838622378,42.03574990755181,42.02649813426255,42.01902732870672,42.03661389540903,42.03338205254317,42.04880992805718,42.02644902111552,42.0189870196251,42.02529985536037,42.02837619205334,42.02666159607317,42.02036268722185,42.03696162266866,42.02001938132206,42.01869179289501,42.02566274377212,42.02701611639693,42.02177488465831,42.00592651448041,42.01909304157013,42.04922120754906,42.04439288395704],[-93.65154106959666,-93.65042599433595,-93.64894673668371,-93.63344615385955,-93.63650336381714,-93.63517834446287,-93.64096087565615,-93.64302240137884,-93.65970980766507,-93.65687336519353,-93.63750827942931,-93.65715438538916,-93.65581264211097,-93.66183094827997,-93.63497000238645,-93.64647378446301,-93.66227304439663,-93.66231158252228,-93.63462596707021,-93.67166005687031,-93.65953665273665,-93.64667494147291,-93.65194310671578,-93.66681968743772,-93.64116057253251,-93.64648118079009,-93.63293680687235,-93.65716902451619,-93.650088528175,-93.64820570997722,-93.65227400111098,-93.66010783848354,-93.63607970518663,-93.66379373439912,-93.63726328503033,-93.64591334734048,-93.64174706139255,-93.66316505474174,-93.64177490738993,-93.66619049960109,-93.62887364851633,-93.65925649568541,-93.64788636448064,-93.64622272894798,-93.6518088328543,-93.65642877993822,-93.65277725735886,-93.64884517690669,-93.65184949503832,-93.64688277651398,-93.62613467529516,-93.64344530962872,-93.6400142173333,-93.65649160597073,-93.65821816491015,-93.6450216957919,-93.66065500857943,-93.6496534930058,-93.64968006901142,-93.6395620322087,-93.6337064729676,-93.64244565472642,-93.64586421466817,-93.6688970531778,-93.65993756207125,-93.65539459897117,-93.65447746537514,-93.65931811321661,-93.63796320755306,-93.65121637545339,-93.6592965222663,-93.66875134637795,-93.66011924371401,-93.63659854208248,-93.62875245353796,-93.64266145297552,-93.65150969656609,-93.65252449240651,-93.63608640530559,-93.63169024927461,-93.64547683408794,-93.65741258045203,-93.66363223553533,-93.66288777620294,-93.62333999274722,-93.66239924451044,-93.65272895570001,-93.65522995481368,-93.65917870381627,-93.64153418079768,-93.64948539942503,-93.64873546796603,-93.64148059835311,-93.64484782706499,-93.63986774654656,-93.65436875099033,-93.64883541549075,-93.66166696709044,-93.66897040761957,-93.63764228488199],[8.077534276526421,5.485966079868376,9.649251458467916,5.896341383922845,13.26696534990333,12.514092217898,12.29106032173149,18.93870580708608,8.804657576838508,8.276547340210527,9.784943790873513,16.39211874105968,17.48959766933694,16.3546313601546,14.61338578956202,17.36487112939358,5.151420767651871,19.93330998811871,18.70117642451078,6.046578008681536,5.429585756501183,12.94646361959167,8.967910417122766,8.912540099117905,7.946839884389192,13.1862185022328,7.331444468582049,16.58711979631335,8.081714907893911,6.975217631552368,18.13800857053138,14.50175033998676,18.07911640731618,13.24625853914768,11.25593722099438,14.33360313181765,19.04103419394232,14.9766163143795,17.760249665007,6.531758917262778,14.75548244081438,17.11697243154049,10.14644648763351,12.35893932403997,10.26048175990582,16.11323629971594,17.23661144962534,18.3672665792983,14.90982936578803,6.503005982376635,8.385817388771102,11.45169689785689,7.563369501149282,18.12055895337835,10.99375160061754,13.13556855777279,17.67581826192327,17.80606510932557,19.31105108582415,12.879789135186,6.506128339096904,16.64688466582447,8.409437106456608,9.197224682429805,15.82827810314484,8.035586961777881,10.49104926991276,7.545773686142638,12.67594884266146,15.2026745735202,14.41742338938639,18.97705871029757,6.06701691634953,17.0168387517333,7.916135370032862,11.9601853156928,6.649805206106976,8.35004405467771,17.84352153656073,10.04383708699606,10.13097612769343,6.979987706290558,11.03796194889583,6.272663669660687,17.01876444858499,9.816488409414887,10.5149889702443,8.390462450915948,13.3317927562166,10.12469277367927,10.43406123411842,13.55476253200322,19.73118214984424,17.61772529222071,16.42703348537907,13.19420637912117,12.21818620804697,5.498720001196489,17.84487215452828,10.7387919316534],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"#03F\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"#03F\",\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00071745929274,42.05096668795214],\"lng\":[-93.67166005687031,-93.62333999274722]}},\"evals\":[],\"jsHooks\":[]}m %>% addCircleMarkers(~lng, ~lat, radius = runif(100, 4, 10), color = c(\"red\")) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.0275439469367,42.02850856687817,42.02471710192324,42.03856490439633,42.02617552024589,42.02185988769047,42.03201242237268,42.02156836879088,42.00071745929274,42.03982404542268,42.01845138245503,42.0145462442034,42.02713285607175,42.03331993717762,42.03942914269688,42.01528218729826,42.03905582360974,42.02689046633677,42.02676699091157,42.02558251597001,42.05096668795214,42.032210951063,42.04086263070892,42.03730671421407,42.03781360320225,42.04218406398204,42.01310542696795,42.02988470783713,42.01024712620395,42.0395379742443,42.03621371549353,42.03759148573567,42.03239579190152,42.03092304970755,42.04000764170451,42.02385331692301,42.00497694162157,42.03345846489503,42.01822184158728,42.03690247746567,42.03492905051364,42.02329699643625,42.02304686530763,42.02930893183068,42.02481924587406,42.03304851136662,42.02572835523341,42.03253167147148,42.02858137871883,42.02493229196173,42.03344554007207,42.03885993007018,42.03453662331968,42.02896697574077,42.03440326830454,42.03153373039122,42.02998154371434,42.03839726794725,42.03000786056483,42.03228592948875,42.02456909646138,42.02140617683165,42.00931476024424,42.02776970753985,42.02058487732943,42.0385882223591,42.04442791183199,42.04104362241481,42.04056039863206,42.01900940574943,42.01885203526652,42.02791607640876,42.02520478385033,42.01998555810211,42.02348692232571,42.03493010366306,42.04210181811401,42.04162838622378,42.03574990755181,42.02649813426255,42.01902732870672,42.03661389540903,42.03338205254317,42.04880992805718,42.02644902111552,42.0189870196251,42.02529985536037,42.02837619205334,42.02666159607317,42.02036268722185,42.03696162266866,42.02001938132206,42.01869179289501,42.02566274377212,42.02701611639693,42.02177488465831,42.00592651448041,42.01909304157013,42.04922120754906,42.04439288395704],[-93.65154106959666,-93.65042599433595,-93.64894673668371,-93.63344615385955,-93.63650336381714,-93.63517834446287,-93.64096087565615,-93.64302240137884,-93.65970980766507,-93.65687336519353,-93.63750827942931,-93.65715438538916,-93.65581264211097,-93.66183094827997,-93.63497000238645,-93.64647378446301,-93.66227304439663,-93.66231158252228,-93.63462596707021,-93.67166005687031,-93.65953665273665,-93.64667494147291,-93.65194310671578,-93.66681968743772,-93.64116057253251,-93.64648118079009,-93.63293680687235,-93.65716902451619,-93.650088528175,-93.64820570997722,-93.65227400111098,-93.66010783848354,-93.63607970518663,-93.66379373439912,-93.63726328503033,-93.64591334734048,-93.64174706139255,-93.66316505474174,-93.64177490738993,-93.66619049960109,-93.62887364851633,-93.65925649568541,-93.64788636448064,-93.64622272894798,-93.6518088328543,-93.65642877993822,-93.65277725735886,-93.64884517690669,-93.65184949503832,-93.64688277651398,-93.62613467529516,-93.64344530962872,-93.6400142173333,-93.65649160597073,-93.65821816491015,-93.6450216957919,-93.66065500857943,-93.6496534930058,-93.64968006901142,-93.6395620322087,-93.6337064729676,-93.64244565472642,-93.64586421466817,-93.6688970531778,-93.65993756207125,-93.65539459897117,-93.65447746537514,-93.65931811321661,-93.63796320755306,-93.65121637545339,-93.6592965222663,-93.66875134637795,-93.66011924371401,-93.63659854208248,-93.62875245353796,-93.64266145297552,-93.65150969656609,-93.65252449240651,-93.63608640530559,-93.63169024927461,-93.64547683408794,-93.65741258045203,-93.66363223553533,-93.66288777620294,-93.62333999274722,-93.66239924451044,-93.65272895570001,-93.65522995481368,-93.65917870381627,-93.64153418079768,-93.64948539942503,-93.64873546796603,-93.64148059835311,-93.64484782706499,-93.63986774654656,-93.65436875099033,-93.64883541549075,-93.66166696709044,-93.66897040761957,-93.63764228488199],[5.604605011641979,4.540006873663515,6.53969751810655,4.084984542336315,7.918386071454734,9.649420917965472,6.92048271605745,6.91589834028855,5.790993708185852,9.637910705525428,9.993599846959114,5.57119958056137,4.462711228523403,4.973153933882713,7.777389595285058,4.10572025179863,4.235488526057452,6.895790067967027,4.928339398466051,8.902905617374927,9.100599534343928,4.090442541521043,7.083072507288307,5.07656456483528,4.270971846301109,7.245370232500136,6.125029662624002,7.186123906634748,4.624782136641443,5.750216467306018,5.629352237097919,9.918148772325367,4.513271839357913,7.742806350346655,5.038326888345182,7.076984515879303,8.621841041836888,7.371562553569674,7.052881934214383,4.30950024491176,8.250742219854146,7.969794497825205,4.530376561451703,4.06879822537303,5.55781673360616,4.614050496835262,9.115869538858533,8.423064006958157,6.243736923206598,7.661491311620921,7.08214810770005,9.18612268101424,9.137943720910698,8.426644810475409,4.337124884128571,8.796433594077826,4.339948318433017,6.178227362688631,7.264035976491868,9.192307959776372,7.583647263702005,6.346588092856109,7.136722662486136,7.313094209413975,4.836021199356765,8.425387518014759,7.513740873895586,8.372442630119622,5.230354791041464,9.607509576249868,4.400237118359655,7.82166892522946,9.340043892618269,6.395246115047485,6.487273213453591,5.803202133160084,9.751131184864789,5.583944507408887,4.455971708986908,8.240967724937946,6.579753054771572,8.915545027237386,8.651618666481227,8.357707146555185,4.981246939394623,6.320858817081898,6.0975471874699,6.79316586907953,7.891539338510484,9.559912758879364,9.464868479873985,6.701976920478046,9.024282701313496,7.008666274603456,7.207120560109615,5.124245505779982,8.084227397106588,9.713494536932558,5.115731906145811,5.687003108207136],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":\"red\",\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":\"red\",\"fillOpacity\":0.2},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00071745929274,42.05096668795214],\"lng\":[-93.67166005687031,-93.62333999274722]}},\"evals\":[],\"jsHooks\":[]} # Discrete colors using the \"RdYlBu\" colorbrewer palette, mapped to categories RdYlBu <- colorFactor(\"RdYlBu\", domain = categories) m %>% addCircleMarkers(~lng, ~lat, radius = ~size, color = ~RdYlBu(category), fillOpacity = 0.5) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.0275439469367,42.02850856687817,42.02471710192324,42.03856490439633,42.02617552024589,42.02185988769047,42.03201242237268,42.02156836879088,42.00071745929274,42.03982404542268,42.01845138245503,42.0145462442034,42.02713285607175,42.03331993717762,42.03942914269688,42.01528218729826,42.03905582360974,42.02689046633677,42.02676699091157,42.02558251597001,42.05096668795214,42.032210951063,42.04086263070892,42.03730671421407,42.03781360320225,42.04218406398204,42.01310542696795,42.02988470783713,42.01024712620395,42.0395379742443,42.03621371549353,42.03759148573567,42.03239579190152,42.03092304970755,42.04000764170451,42.02385331692301,42.00497694162157,42.03345846489503,42.01822184158728,42.03690247746567,42.03492905051364,42.02329699643625,42.02304686530763,42.02930893183068,42.02481924587406,42.03304851136662,42.02572835523341,42.03253167147148,42.02858137871883,42.02493229196173,42.03344554007207,42.03885993007018,42.03453662331968,42.02896697574077,42.03440326830454,42.03153373039122,42.02998154371434,42.03839726794725,42.03000786056483,42.03228592948875,42.02456909646138,42.02140617683165,42.00931476024424,42.02776970753985,42.02058487732943,42.0385882223591,42.04442791183199,42.04104362241481,42.04056039863206,42.01900940574943,42.01885203526652,42.02791607640876,42.02520478385033,42.01998555810211,42.02348692232571,42.03493010366306,42.04210181811401,42.04162838622378,42.03574990755181,42.02649813426255,42.01902732870672,42.03661389540903,42.03338205254317,42.04880992805718,42.02644902111552,42.0189870196251,42.02529985536037,42.02837619205334,42.02666159607317,42.02036268722185,42.03696162266866,42.02001938132206,42.01869179289501,42.02566274377212,42.02701611639693,42.02177488465831,42.00592651448041,42.01909304157013,42.04922120754906,42.04439288395704],[-93.65154106959666,-93.65042599433595,-93.64894673668371,-93.63344615385955,-93.63650336381714,-93.63517834446287,-93.64096087565615,-93.64302240137884,-93.65970980766507,-93.65687336519353,-93.63750827942931,-93.65715438538916,-93.65581264211097,-93.66183094827997,-93.63497000238645,-93.64647378446301,-93.66227304439663,-93.66231158252228,-93.63462596707021,-93.67166005687031,-93.65953665273665,-93.64667494147291,-93.65194310671578,-93.66681968743772,-93.64116057253251,-93.64648118079009,-93.63293680687235,-93.65716902451619,-93.650088528175,-93.64820570997722,-93.65227400111098,-93.66010783848354,-93.63607970518663,-93.66379373439912,-93.63726328503033,-93.64591334734048,-93.64174706139255,-93.66316505474174,-93.64177490738993,-93.66619049960109,-93.62887364851633,-93.65925649568541,-93.64788636448064,-93.64622272894798,-93.6518088328543,-93.65642877993822,-93.65277725735886,-93.64884517690669,-93.65184949503832,-93.64688277651398,-93.62613467529516,-93.64344530962872,-93.6400142173333,-93.65649160597073,-93.65821816491015,-93.6450216957919,-93.66065500857943,-93.6496534930058,-93.64968006901142,-93.6395620322087,-93.6337064729676,-93.64244565472642,-93.64586421466817,-93.6688970531778,-93.65993756207125,-93.65539459897117,-93.65447746537514,-93.65931811321661,-93.63796320755306,-93.65121637545339,-93.6592965222663,-93.66875134637795,-93.66011924371401,-93.63659854208248,-93.62875245353796,-93.64266145297552,-93.65150969656609,-93.65252449240651,-93.63608640530559,-93.63169024927461,-93.64547683408794,-93.65741258045203,-93.66363223553533,-93.66288777620294,-93.62333999274722,-93.66239924451044,-93.65272895570001,-93.65522995481368,-93.65917870381627,-93.64153418079768,-93.64948539942503,-93.64873546796603,-93.64148059835311,-93.64484782706499,-93.63986774654656,-93.65436875099033,-93.64883541549075,-93.66166696709044,-93.66897040761957,-93.63764228488199],[8.077534276526421,5.485966079868376,9.649251458467916,5.896341383922845,13.26696534990333,12.514092217898,12.29106032173149,18.93870580708608,8.804657576838508,8.276547340210527,9.784943790873513,16.39211874105968,17.48959766933694,16.3546313601546,14.61338578956202,17.36487112939358,5.151420767651871,19.93330998811871,18.70117642451078,6.046578008681536,5.429585756501183,12.94646361959167,8.967910417122766,8.912540099117905,7.946839884389192,13.1862185022328,7.331444468582049,16.58711979631335,8.081714907893911,6.975217631552368,18.13800857053138,14.50175033998676,18.07911640731618,13.24625853914768,11.25593722099438,14.33360313181765,19.04103419394232,14.9766163143795,17.760249665007,6.531758917262778,14.75548244081438,17.11697243154049,10.14644648763351,12.35893932403997,10.26048175990582,16.11323629971594,17.23661144962534,18.3672665792983,14.90982936578803,6.503005982376635,8.385817388771102,11.45169689785689,7.563369501149282,18.12055895337835,10.99375160061754,13.13556855777279,17.67581826192327,17.80606510932557,19.31105108582415,12.879789135186,6.506128339096904,16.64688466582447,8.409437106456608,9.197224682429805,15.82827810314484,8.035586961777881,10.49104926991276,7.545773686142638,12.67594884266146,15.2026745735202,14.41742338938639,18.97705871029757,6.06701691634953,17.0168387517333,7.916135370032862,11.9601853156928,6.649805206106976,8.35004405467771,17.84352153656073,10.04383708699606,10.13097612769343,6.979987706290558,11.03796194889583,6.272663669660687,17.01876444858499,9.816488409414887,10.5149889702443,8.390462450915948,13.3317927562166,10.12469277367927,10.43406123411842,13.55476253200322,19.73118214984424,17.61772529222071,16.42703348537907,13.19420637912117,12.21818620804697,5.498720001196489,17.84487215452828,10.7387919316534],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":[\"#74ADD1\",\"#74ADD1\",\"#FEE090\",\"#313695\",\"#4575B4\",\"#A50026\",\"#74ADD1\",\"#313695\",\"#A50026\",\"#D73027\",\"#ABD9E9\",\"#74ADD1\",\"#4575B4\",\"#A50026\",\"#FDAE61\",\"#F46D43\",\"#ABD9E9\",\"#A50026\",\"#FDAE61\",\"#FEE090\",\"#4575B4\",\"#F46D43\",\"#313695\",\"#FDAE61\",\"#74ADD1\",\"#74ADD1\",\"#313695\",\"#4575B4\",\"#74ADD1\",\"#ABD9E9\",\"#D73027\",\"#ABD9E9\",\"#E0F3F8\",\"#4575B4\",\"#4575B4\",\"#A50026\",\"#A50026\",\"#74ADD1\",\"#F46D43\",\"#E0F3F8\",\"#A50026\",\"#FEE090\",\"#A50026\",\"#A50026\",\"#4575B4\",\"#FDAE61\",\"#313695\",\"#74ADD1\",\"#74ADD1\",\"#FDAE61\",\"#E0F3F8\",\"#FEE090\",\"#74ADD1\",\"#D73027\",\"#FDAE61\",\"#FDAE61\",\"#4575B4\",\"#D73027\",\"#E0F3F8\",\"#E0F3F8\",\"#ABD9E9\",\"#A50026\",\"#FDAE61\",\"#313695\",\"#313695\",\"#4575B4\",\"#F46D43\",\"#313695\",\"#4575B4\",\"#ABD9E9\",\"#F46D43\",\"#D73027\",\"#F46D43\",\"#ABD9E9\",\"#313695\",\"#A50026\",\"#D73027\",\"#FDAE61\",\"#4575B4\",\"#FDAE61\",\"#FDAE61\",\"#D73027\",\"#D73027\",\"#A50026\",\"#ABD9E9\",\"#A50026\",\"#313695\",\"#E0F3F8\",\"#74ADD1\",\"#FDAE61\",\"#74ADD1\",\"#313695\",\"#A50026\",\"#F46D43\",\"#D73027\",\"#ABD9E9\",\"#74ADD1\",\"#E0F3F8\",\"#F46D43\",\"#F46D43\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#74ADD1\",\"#74ADD1\",\"#FEE090\",\"#313695\",\"#4575B4\",\"#A50026\",\"#74ADD1\",\"#313695\",\"#A50026\",\"#D73027\",\"#ABD9E9\",\"#74ADD1\",\"#4575B4\",\"#A50026\",\"#FDAE61\",\"#F46D43\",\"#ABD9E9\",\"#A50026\",\"#FDAE61\",\"#FEE090\",\"#4575B4\",\"#F46D43\",\"#313695\",\"#FDAE61\",\"#74ADD1\",\"#74ADD1\",\"#313695\",\"#4575B4\",\"#74ADD1\",\"#ABD9E9\",\"#D73027\",\"#ABD9E9\",\"#E0F3F8\",\"#4575B4\",\"#4575B4\",\"#A50026\",\"#A50026\",\"#74ADD1\",\"#F46D43\",\"#E0F3F8\",\"#A50026\",\"#FEE090\",\"#A50026\",\"#A50026\",\"#4575B4\",\"#FDAE61\",\"#313695\",\"#74ADD1\",\"#74ADD1\",\"#FDAE61\",\"#E0F3F8\",\"#FEE090\",\"#74ADD1\",\"#D73027\",\"#FDAE61\",\"#FDAE61\",\"#4575B4\",\"#D73027\",\"#E0F3F8\",\"#E0F3F8\",\"#ABD9E9\",\"#A50026\",\"#FDAE61\",\"#313695\",\"#313695\",\"#4575B4\",\"#F46D43\",\"#313695\",\"#4575B4\",\"#ABD9E9\",\"#F46D43\",\"#D73027\",\"#F46D43\",\"#ABD9E9\",\"#313695\",\"#A50026\",\"#D73027\",\"#FDAE61\",\"#4575B4\",\"#FDAE61\",\"#FDAE61\",\"#D73027\",\"#D73027\",\"#A50026\",\"#ABD9E9\",\"#A50026\",\"#313695\",\"#E0F3F8\",\"#74ADD1\",\"#FDAE61\",\"#74ADD1\",\"#313695\",\"#A50026\",\"#F46D43\",\"#D73027\",\"#ABD9E9\",\"#74ADD1\",\"#E0F3F8\",\"#F46D43\",\"#F46D43\"],\"fillOpacity\":0.5},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00071745929274,42.05096668795214],\"lng\":[-93.67166005687031,-93.62333999274722]}},\"evals\":[],\"jsHooks\":[]} # Continuous colors using the \"Greens\" colorbrewer palette, mapped to value greens <- colorNumeric(\"Greens\", domain = NULL) m %>% addCircleMarkers(~lng, ~lat, radius = ~size, color = ~greens(value), fillOpacity = 0.5) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addCircleMarkers\",\"args\":[[42.0275439469367,42.02850856687817,42.02471710192324,42.03856490439633,42.02617552024589,42.02185988769047,42.03201242237268,42.02156836879088,42.00071745929274,42.03982404542268,42.01845138245503,42.0145462442034,42.02713285607175,42.03331993717762,42.03942914269688,42.01528218729826,42.03905582360974,42.02689046633677,42.02676699091157,42.02558251597001,42.05096668795214,42.032210951063,42.04086263070892,42.03730671421407,42.03781360320225,42.04218406398204,42.01310542696795,42.02988470783713,42.01024712620395,42.0395379742443,42.03621371549353,42.03759148573567,42.03239579190152,42.03092304970755,42.04000764170451,42.02385331692301,42.00497694162157,42.03345846489503,42.01822184158728,42.03690247746567,42.03492905051364,42.02329699643625,42.02304686530763,42.02930893183068,42.02481924587406,42.03304851136662,42.02572835523341,42.03253167147148,42.02858137871883,42.02493229196173,42.03344554007207,42.03885993007018,42.03453662331968,42.02896697574077,42.03440326830454,42.03153373039122,42.02998154371434,42.03839726794725,42.03000786056483,42.03228592948875,42.02456909646138,42.02140617683165,42.00931476024424,42.02776970753985,42.02058487732943,42.0385882223591,42.04442791183199,42.04104362241481,42.04056039863206,42.01900940574943,42.01885203526652,42.02791607640876,42.02520478385033,42.01998555810211,42.02348692232571,42.03493010366306,42.04210181811401,42.04162838622378,42.03574990755181,42.02649813426255,42.01902732870672,42.03661389540903,42.03338205254317,42.04880992805718,42.02644902111552,42.0189870196251,42.02529985536037,42.02837619205334,42.02666159607317,42.02036268722185,42.03696162266866,42.02001938132206,42.01869179289501,42.02566274377212,42.02701611639693,42.02177488465831,42.00592651448041,42.01909304157013,42.04922120754906,42.04439288395704],[-93.65154106959666,-93.65042599433595,-93.64894673668371,-93.63344615385955,-93.63650336381714,-93.63517834446287,-93.64096087565615,-93.64302240137884,-93.65970980766507,-93.65687336519353,-93.63750827942931,-93.65715438538916,-93.65581264211097,-93.66183094827997,-93.63497000238645,-93.64647378446301,-93.66227304439663,-93.66231158252228,-93.63462596707021,-93.67166005687031,-93.65953665273665,-93.64667494147291,-93.65194310671578,-93.66681968743772,-93.64116057253251,-93.64648118079009,-93.63293680687235,-93.65716902451619,-93.650088528175,-93.64820570997722,-93.65227400111098,-93.66010783848354,-93.63607970518663,-93.66379373439912,-93.63726328503033,-93.64591334734048,-93.64174706139255,-93.66316505474174,-93.64177490738993,-93.66619049960109,-93.62887364851633,-93.65925649568541,-93.64788636448064,-93.64622272894798,-93.6518088328543,-93.65642877993822,-93.65277725735886,-93.64884517690669,-93.65184949503832,-93.64688277651398,-93.62613467529516,-93.64344530962872,-93.6400142173333,-93.65649160597073,-93.65821816491015,-93.6450216957919,-93.66065500857943,-93.6496534930058,-93.64968006901142,-93.6395620322087,-93.6337064729676,-93.64244565472642,-93.64586421466817,-93.6688970531778,-93.65993756207125,-93.65539459897117,-93.65447746537514,-93.65931811321661,-93.63796320755306,-93.65121637545339,-93.6592965222663,-93.66875134637795,-93.66011924371401,-93.63659854208248,-93.62875245353796,-93.64266145297552,-93.65150969656609,-93.65252449240651,-93.63608640530559,-93.63169024927461,-93.64547683408794,-93.65741258045203,-93.66363223553533,-93.66288777620294,-93.62333999274722,-93.66239924451044,-93.65272895570001,-93.65522995481368,-93.65917870381627,-93.64153418079768,-93.64948539942503,-93.64873546796603,-93.64148059835311,-93.64484782706499,-93.63986774654656,-93.65436875099033,-93.64883541549075,-93.66166696709044,-93.66897040761957,-93.63764228488199],[8.077534276526421,5.485966079868376,9.649251458467916,5.896341383922845,13.26696534990333,12.514092217898,12.29106032173149,18.93870580708608,8.804657576838508,8.276547340210527,9.784943790873513,16.39211874105968,17.48959766933694,16.3546313601546,14.61338578956202,17.36487112939358,5.151420767651871,19.93330998811871,18.70117642451078,6.046578008681536,5.429585756501183,12.94646361959167,8.967910417122766,8.912540099117905,7.946839884389192,13.1862185022328,7.331444468582049,16.58711979631335,8.081714907893911,6.975217631552368,18.13800857053138,14.50175033998676,18.07911640731618,13.24625853914768,11.25593722099438,14.33360313181765,19.04103419394232,14.9766163143795,17.760249665007,6.531758917262778,14.75548244081438,17.11697243154049,10.14644648763351,12.35893932403997,10.26048175990582,16.11323629971594,17.23661144962534,18.3672665792983,14.90982936578803,6.503005982376635,8.385817388771102,11.45169689785689,7.563369501149282,18.12055895337835,10.99375160061754,13.13556855777279,17.67581826192327,17.80606510932557,19.31105108582415,12.879789135186,6.506128339096904,16.64688466582447,8.409437106456608,9.197224682429805,15.82827810314484,8.035586961777881,10.49104926991276,7.545773686142638,12.67594884266146,15.2026745735202,14.41742338938639,18.97705871029757,6.06701691634953,17.0168387517333,7.916135370032862,11.9601853156928,6.649805206106976,8.35004405467771,17.84352153656073,10.04383708699606,10.13097612769343,6.979987706290558,11.03796194889583,6.272663669660687,17.01876444858499,9.816488409414887,10.5149889702443,8.390462450915948,13.3317927562166,10.12469277367927,10.43406123411842,13.55476253200322,19.73118214984424,17.61772529222071,16.42703348537907,13.19420637912117,12.21818620804697,5.498720001196489,17.84487215452828,10.7387919316534],null,null,{\"interactive\":true,\"className\":\"\",\"stroke\":true,\"color\":[\"#95D391\",\"#005120\",\"#58B668\",\"#93D28F\",\"#218843\",\"#9BD696\",\"#30984E\",\"#D9F0D3\",\"#D7EFD1\",\"#137B37\",\"#0C7533\",\"#72C375\",\"#369F54\",\"#349D52\",\"#BAE3B3\",\"#CEECC8\",\"#54B365\",\"#39A257\",\"#3AA357\",\"#3BA458\",\"#00441B\",\"#89CE87\",\"#69BE70\",\"#349C52\",\"#E7F6E2\",\"#6CC072\",\"#37A055\",\"#1E8540\",\"#77C578\",\"#91D28E\",\"#31994F\",\"#3EA85B\",\"#228944\",\"#43AC5E\",\"#77C679\",\"#005020\",\"#5AB769\",\"#E4F4DF\",\"#77C578\",\"#117936\",\"#258D46\",\"#3AA357\",\"#75C577\",\"#AFDFA8\",\"#0E7634\",\"#72C375\",\"#88CD86\",\"#3CA559\",\"#0D7633\",\"#72C375\",\"#137B38\",\"#289049\",\"#9ED899\",\"#7EC97E\",\"#41AB5D\",\"#F7FCF5\",\"#A0D99A\",\"#64BC6E\",\"#30984F\",\"#228A44\",\"#319A50\",\"#CAEAC3\",\"#5CB86A\",\"#005C25\",\"#A7DCA1\",\"#58B567\",\"#41AB5D\",\"#91D28E\",\"#ADDEA7\",\"#289049\",\"#05712F\",\"#A8DCA2\",\"#C6E9BF\",\"#90D18D\",\"#7BC77B\",\"#C0E6B9\",\"#D3EECD\",\"#77C679\",\"#B3E0AC\",\"#C6E9BF\",\"#349D52\",\"#A4DA9E\",\"#258D47\",\"#3DA75A\",\"#117A36\",\"#005E26\",\"#4CB062\",\"#45AD5F\",\"#84CB83\",\"#7BC77B\",\"#3FA95C\",\"#C6E8BF\",\"#75C477\",\"#DFF2D9\",\"#278F48\",\"#A4DA9D\",\"#127A37\",\"#369E54\",\"#B7E2B0\",\"#69BE70\"],\"weight\":5,\"opacity\":0.5,\"fill\":true,\"fillColor\":[\"#95D391\",\"#005120\",\"#58B668\",\"#93D28F\",\"#218843\",\"#9BD696\",\"#30984E\",\"#D9F0D3\",\"#D7EFD1\",\"#137B37\",\"#0C7533\",\"#72C375\",\"#369F54\",\"#349D52\",\"#BAE3B3\",\"#CEECC8\",\"#54B365\",\"#39A257\",\"#3AA357\",\"#3BA458\",\"#00441B\",\"#89CE87\",\"#69BE70\",\"#349C52\",\"#E7F6E2\",\"#6CC072\",\"#37A055\",\"#1E8540\",\"#77C578\",\"#91D28E\",\"#31994F\",\"#3EA85B\",\"#228944\",\"#43AC5E\",\"#77C679\",\"#005020\",\"#5AB769\",\"#E4F4DF\",\"#77C578\",\"#117936\",\"#258D46\",\"#3AA357\",\"#75C577\",\"#AFDFA8\",\"#0E7634\",\"#72C375\",\"#88CD86\",\"#3CA559\",\"#0D7633\",\"#72C375\",\"#137B38\",\"#289049\",\"#9ED899\",\"#7EC97E\",\"#41AB5D\",\"#F7FCF5\",\"#A0D99A\",\"#64BC6E\",\"#30984F\",\"#228A44\",\"#319A50\",\"#CAEAC3\",\"#5CB86A\",\"#005C25\",\"#A7DCA1\",\"#58B567\",\"#41AB5D\",\"#91D28E\",\"#ADDEA7\",\"#289049\",\"#05712F\",\"#A8DCA2\",\"#C6E9BF\",\"#90D18D\",\"#7BC77B\",\"#C0E6B9\",\"#D3EECD\",\"#77C679\",\"#B3E0AC\",\"#C6E9BF\",\"#349D52\",\"#A4DA9E\",\"#258D47\",\"#3DA75A\",\"#117A36\",\"#005E26\",\"#4CB062\",\"#45AD5F\",\"#84CB83\",\"#7BC77B\",\"#3FA95C\",\"#C6E8BF\",\"#75C477\",\"#DFF2D9\",\"#278F48\",\"#A4DA9D\",\"#127A37\",\"#369E54\",\"#B7E2B0\",\"#69BE70\"],\"fillOpacity\":0.5},null,null,null,null,null,{\"interactive\":false,\"permanent\":false,\"direction\":\"auto\",\"opacity\":1,\"offset\":[0,0],\"textsize\":\"10px\",\"textOnly\":false,\"className\":\"\",\"sticky\":true},null]}],\"limits\":{\"lat\":[42.00071745929274,42.05096668795214],\"lng\":[-93.67166005687031,-93.62333999274722]}},\"evals\":[],\"jsHooks\":[]} # }"},{"path":"https://rstudio.github.io/leaflet/reference/leafletDependencies.html","id":null,"dir":"Reference","previous_headings":"","what":"Various leaflet dependency functions for use in downstream packages — leafletDependencies","title":"Various leaflet dependency functions for use in downstream packages — leafletDependencies","text":"Various leaflet dependency functions use downstream packages","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletDependencies.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Various leaflet dependency functions for use in downstream packages — leafletDependencies","text":"","code":"leafletDependencies"},{"path":"https://rstudio.github.io/leaflet/reference/leafletDependencies.html","id":"format","dir":"Reference","previous_headings":"","what":"Format","title":"Various leaflet dependency functions for use in downstream packages — leafletDependencies","text":"object class list length 13.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletDependencies.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Various leaflet dependency functions for use in downstream packages — leafletDependencies","text":"","code":"if (FALSE) { # \\dontrun{ addBootStrap <- function(map) { map$dependencies <- c(map$dependencies, leafletDependencies$bootstrap()) map } } # }"},{"path":"https://rstudio.github.io/leaflet/reference/leafletProxy.html","id":null,"dir":"Reference","previous_headings":"","what":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","title":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","text":"Creates map-like object can used customize control map already rendered. use Shiny apps Shiny docs .","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletProxy.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","text":"","code":"leafletProxy( mapId, session = shiny::getDefaultReactiveDomain(), data = NULL, deferUntilFlush = TRUE )"},{"path":"https://rstudio.github.io/leaflet/reference/leafletProxy.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","text":"mapId single-element character vector indicating output ID map modify (invoked Shiny module, namespace added automatically) session Shiny session object map belongs; usually default value suffice data data object; see Details leaflet() help topic deferUntilFlush indicates whether actions performed instance carried right away, whether held next time outputs updated; defaults TRUE","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletProxy.html","id":"details","dir":"Reference","previous_headings":"","what":"Details","title":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","text":"Normally, create Leaflet map using leaflet(). creates -memory representation map can customize using functions like addPolygons() setView(). map can printed R console, included R Markdown document, rendered Shiny output. case Shiny, may want customize map, even rendered output. point, -memory representation map long gone, user's web browser already realized Leaflet map instance. leafletProxy() comes . returns object can stand usual Leaflet map object. usual map functions like addPolygons() setView() can called, instead customizing -memory representation, commands execute live Leaflet map instance.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletProxy.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Send commands to a Leaflet instance in a Shiny app — leafletProxy","text":"","code":"library(shiny) ui <- fluidPage( leafletOutput(\"map1\") ) map <- leaflet() %>% addCircleMarkers( lng = runif(10), lat = runif(10), layerId = paste0(\"marker\", 1:10)) server <- function(input, output, session) { output$map1 <- renderLeaflet(map) observeEvent(input$map1_marker_click, { leafletProxy(\"map1\", session) %>% removeMarker(input$map1_marker_click$id) }) } app <- shinyApp(ui, server) if (interactive()) app"},{"path":"https://rstudio.github.io/leaflet/reference/leafletSizingPolicy.html","id":null,"dir":"Reference","previous_headings":"","what":"Leaflet sizing policy — leafletSizingPolicy","title":"Leaflet sizing policy — leafletSizingPolicy","text":"Sizing policy used withing leaflet htmlwidgets.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletSizingPolicy.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Leaflet sizing policy — leafletSizingPolicy","text":"","code":"leafletSizingPolicy( defaultWidth = \"100%\", defaultHeight = 400, padding = 0, browser.fill = TRUE, ... )"},{"path":"https://rstudio.github.io/leaflet/reference/leafletSizingPolicy.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Leaflet sizing policy — leafletSizingPolicy","text":"defaultWidth defaults \"100%\" available width defaultHeight defaults 400px tall padding defaults 0px browser.fill defaults TRUE ... Arguments passed htmlwidgets::sizingPolicy viewer.defaultWidth default width used display widget within RStudio Viewer. viewer.defaultHeight default height used display widget within RStudio Viewer. viewer.padding Padding around widget displayed RStudio Viewer (defaults 15 pixels). viewer.fill displayed RStudio Viewer, automatically size widget viewer dimensions (note viewer.padding still applied). Default TRUE. viewer.suppress Never display widget within RStudio Viewer (useful widgets require large amount space rendering). Defaults FALSE. viewer.paneHeight Request RStudio Viewer forced specific height displaying widget. browser.defaultWidth default width used display widget within standalone web browser. browser.defaultHeight default height used display widget within standalone web browser. browser.padding Padding around widget displayed standalone browser (defaults 40 pixels). browser.external displaying browser, always use external browser (via browseURL()). Defaults `FALSE“, result use internal browser within RStudio v1.1 higher. knitr.defaultWidth default width used display widget within documents generated knitr (e.g. R Markdown). knitr.defaultHeight default height used display widget within documents generated knitr (e.g. R Markdown). knitr.figure Apply default knitr fig.width fig.height widget rendered within R Markdown documents. Defaults TRUE. fill Whether widget's container treated fill item, meaning height allowed grow/shrink fit fill container opinionated height (see htmltools::bindFillRole() ). Examples fill containers include bslib::card() bslib::card_body_fill().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/leafletSizingPolicy.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Leaflet sizing policy — leafletSizingPolicy","text":"htmlwidgets::sizingPolicy object","code":""},{"path":"https://rstudio.github.io/leaflet/reference/makeAwesomeIcon.html","id":null,"dir":"Reference","previous_headings":"","what":"Make Awesome Icon — makeAwesomeIcon","title":"Make Awesome Icon — makeAwesomeIcon","text":"Make Awesome Icon","code":""},{"path":"https://rstudio.github.io/leaflet/reference/makeAwesomeIcon.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Make Awesome Icon — makeAwesomeIcon","text":"","code":"makeAwesomeIcon( icon = \"home\", library = \"glyphicon\", markerColor = \"blue\", iconColor = \"white\", spin = FALSE, extraClasses = NULL, squareMarker = FALSE, iconRotate = 0, fontFamily = \"monospace\", text = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/makeAwesomeIcon.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Make Awesome Icon — makeAwesomeIcon","text":"icon Name icon library icon library. Default \"glyphicon\", possible values \"fa\" (fontawesome) \"ion\" (ionicons). markerColor Possible values \"red\", \"darkred\", \"lightred\", \"orange\", \"beige\", \"green\", \"darkgreen\", \"lightgreen\", \"blue\", \"darkblue\", \"lightblue\", \"purple\", \"darkpurple\", \"pink\", \"cadetblue\", \"white\", \"gray\", \"lightgray\", \"black\" iconColor color use icon . Use CSS-valid color (hex, rgba, etc.) named web color. spin TRUE, make icon spin (works library = \"fa\") extraClasses Additional css classes include icon. squareMarker Whether use square marker. iconRotate Rotate icon given angle. fontFamily Used text option specified. text Use text string instead icon. Argument addAwesomeMarkers().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/makeIcon.html","id":null,"dir":"Reference","previous_headings":"","what":"Define icon sets — makeIcon","title":"Define icon sets — makeIcon","text":"Define icon sets","code":""},{"path":"https://rstudio.github.io/leaflet/reference/makeIcon.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Define icon sets — makeIcon","text":"","code":"makeIcon( iconUrl = NULL, iconRetinaUrl = NULL, iconWidth = NULL, iconHeight = NULL, iconAnchorX = NULL, iconAnchorY = NULL, shadowUrl = NULL, shadowRetinaUrl = NULL, shadowWidth = NULL, shadowHeight = NULL, shadowAnchorX = NULL, shadowAnchorY = NULL, popupAnchorX = NULL, popupAnchorY = NULL, className = NULL )"},{"path":"https://rstudio.github.io/leaflet/reference/makeIcon.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Define icon sets — makeIcon","text":"iconUrl URL file path icon image iconRetinaUrl URL file path retina sized version icon image iconWidth, iconHeight size icon image pixels iconAnchorX, iconAnchorY coordinates \"tip\" icon (relative top left corner, .e., top left corner means iconAnchorX = 0 iconAnchorY = 0), icon aligned point marker's geographical location shadowUrl URL file path icon shadow image shadowRetinaUrl URL file path retina sized version icon shadow image shadowWidth, shadowHeight size shadow image pixels shadowAnchorX, shadowAnchorY coordinates \"tip\" shadow popupAnchorX, popupAnchorY coordinates point popups \"open\", relative icon anchor className custom class name assign icon shadow images","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":null,"dir":"Reference","previous_headings":"","what":"Graphics elements and layers — addControl","title":"Graphics elements and layers — addControl","text":"Add graphics elements layers map widget.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Graphics elements and layers — addControl","text":"","code":"addControl( map, html, position = c(\"topleft\", \"topright\", \"bottomleft\", \"bottomright\"), layerId = NULL, className = \"info legend\", data = getMapData(map) ) addTiles( map, urlTemplate = \"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\", attribution = NULL, layerId = NULL, group = NULL, options = tileOptions(), data = getMapData(map) ) addWMSTiles( map, baseUrl, layerId = NULL, group = NULL, options = WMSTileOptions(), attribution = NULL, layers = \"\", data = getMapData(map) ) addPopups( map, lng = NULL, lat = NULL, popup, layerId = NULL, group = NULL, options = popupOptions(), data = getMapData(map) ) addMarkers( map, lng = NULL, lat = NULL, layerId = NULL, group = NULL, icon = NULL, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = markerOptions(), clusterOptions = NULL, clusterId = NULL, data = getMapData(map) ) addLabelOnlyMarkers( map, lng = NULL, lat = NULL, layerId = NULL, group = NULL, icon = NULL, label = NULL, labelOptions = NULL, options = markerOptions(), clusterOptions = NULL, clusterId = NULL, data = getMapData(map) ) addCircleMarkers( map, lng = NULL, lat = NULL, radius = 10, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = pathOptions(), clusterOptions = NULL, clusterId = NULL, data = getMapData(map) ) highlightOptions( stroke = NULL, color = NULL, weight = NULL, opacity = NULL, fill = NULL, fillColor = NULL, fillOpacity = NULL, dashArray = NULL, bringToFront = NULL, sendToBack = NULL ) addCircles( map, lng = NULL, lat = NULL, radius = 10, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = pathOptions(), highlightOptions = NULL, data = getMapData(map) ) addPolylines( map, lng = NULL, lat = NULL, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = FALSE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, smoothFactor = 1, noClip = FALSE, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = pathOptions(), highlightOptions = NULL, data = getMapData(map) ) addRectangles( map, lng1, lat1, lng2, lat2, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, smoothFactor = 1, noClip = FALSE, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = pathOptions(), highlightOptions = NULL, data = getMapData(map) ) addPolygons( map, lng = NULL, lat = NULL, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, smoothFactor = 1, noClip = FALSE, popup = NULL, popupOptions = NULL, label = NULL, labelOptions = NULL, options = pathOptions(), highlightOptions = NULL, data = getMapData(map) ) addGeoJSON( map, geojson, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, smoothFactor = 1, noClip = FALSE, options = pathOptions(), data = getMapData(map) ) addTopoJSON( map, topojson, layerId = NULL, group = NULL, stroke = TRUE, color = \"#03F\", weight = 5, opacity = 0.5, fill = TRUE, fillColor = color, fillOpacity = 0.2, dashArray = NULL, smoothFactor = 1, noClip = FALSE, options = pathOptions() )"},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Graphics elements and layers — addControl","text":"map map widget object created leaflet() html content control. May provided string HTML generated Shiny/htmltools tags position position control: \"topleft\", \"topright\", \"bottomleft\", \"bottomright\". layerId layer id className extra CSS classes append control, space separated data data object argument values derived; default, data object provided leaflet() initially, can overridden urlTemplate character string URL template attribution attribution text tile layer (HTML) group name group newly created layers belong (clearGroup() addLayersControl() purposes). Human-friendly group names permitted–need short, identifier-style names. number layers even different types layers (e.g., markers polygons) can share group name. options list extra options tile layers, popups, paths (circles, rectangles, polygons, ...), map elements baseUrl base URL WMS service layers comma-separated list WMS layers show lng numeric vector longitudes, one-sided formula form ~x x variable data; default (explicitly provided), automatically inferred data looking column named lng, long, longitude (case-insensitively) lat vector latitudes formula (similar lng argument; names lat latitude used guessing latitude column data) popup character vector HTML content popups (recommended escape text using htmltools::htmlEscape() security reasons) icon icon(s) markers; icon represented R list form list(iconUrl = \"?\", iconSize = c(x, y)), can use icons() create multiple icons; note use R list contains images local files, local image files base64 encoded HTML page icon images still available even publish map elsewhere popupOptions Vector popupOptions() provide popups label character vector HTML content labels labelOptions Vector labelOptions() provide label options label. Default NULL clusterOptions NULL, markers clustered using Leaflet.markercluster; can use markerClusterOptions() specify marker cluster options clusterId id marker cluster layer radius numeric vector radii circles; can also one-sided formula, case radius values derived data (units meters circles, pixels circle markers) stroke whether draw stroke along path (e.g., borders polygons circles) color stroke color weight stroke width pixels opacity stroke opacity (layer opacity tile layers) fill whether fill path color (e.g., filling polygons circles) fillColor fill color fillOpacity fill opacity dashArray string defines stroke dash pattern bringToFront Whether shape brought front hover. sendToBack whether shape sent back mouse . highlightOptions Options highlighting shape mouse . smoothFactor much simplify polyline zoom level (means better performance less accurate representation) noClip whether disable polyline clipping lng1, lat1, lng2, lat2 latitudes longitudes south-west north-east corners rectangles geojson GeoJSON list, character vector length 1 topojson TopoJSON list, character vector length 1","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Graphics elements and layers — addControl","text":"new map object","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":"functions","dir":"Reference","previous_headings":"","what":"Functions","title":"Graphics elements and layers — addControl","text":"addControl(): Add arbitrary HTML controls map addTiles(): Add tile layer map addWMSTiles(): Add WMS tile layer map addPopups(): Add popups map addMarkers(): Add markers map addLabelOnlyMarkers(): Add Label markers map addCircleMarkers(): Add circle markers map highlightOptions(): Options highlight shape hover addCircles(): Add circles map addPolylines(): Add polylines map addRectangles(): Add rectangles map addPolygons(): Add polygons map addGeoJSON(): Add GeoJSON layers map addTopoJSON(): Add TopoJSON layers map","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-layers.html","id":"references","dir":"Reference","previous_headings":"","what":"References","title":"Graphics elements and layers — addControl","text":"Leaflet API documentation: https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":null,"dir":"Reference","previous_headings":"","what":"Methods to manipulate the map widget — setView","title":"Methods to manipulate the map widget — setView","text":"series methods manipulate map.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Methods to manipulate the map widget — setView","text":"","code":"setView(map, lng, lat, zoom, options = list()) flyTo(map, lng, lat, zoom, options = list()) fitBounds(map, lng1, lat1, lng2, lat2, options = list()) flyToBounds(map, lng1, lat1, lng2, lat2, options = list()) setMaxBounds(map, lng1, lat1, lng2, lat2) clearBounds(map)"},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Methods to manipulate the map widget — setView","text":"map map widget object created leaflet() lng longitude map center lat latitude map center zoom zoom level options list zoom/pan options (see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#zoom/pan-options) lng1, lat1, lng2, lat2 coordinates map bounds","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Methods to manipulate the map widget — setView","text":"modified map widget.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"functions","dir":"Reference","previous_headings":"","what":"Functions","title":"Methods to manipulate the map widget — setView","text":"setView(): Set view map (center zoom level) flyTo(): Flys given location/zoom-level using smooth pan-zoom. fitBounds(): Set bounds map flyToBounds(): Flys given bound using smooth pan/zoom. setMaxBounds(): Restricts map view given bounds clearBounds(): Clear bounds map, bounds automatically determined latitudes longitudes map elements available (otherwise full world view used)","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"references","dir":"Reference","previous_headings":"","what":"References","title":"Methods to manipulate the map widget — setView","text":"https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#map-methods--modifying-map-state","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-methods.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Methods to manipulate the map widget — setView","text":"","code":"m <- leaflet() %>% addTiles() %>% setView(-71.0382679, 42.3489054, zoom = 18) m # the RStudio 'headquarter' {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}],\"setView\":[[42.3489054,-71.03826789999999],18,[]]},\"evals\":[],\"jsHooks\":[]}m %>% fitBounds(-72, 40, -70, 43) {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}],\"fitBounds\":[40,-72,43,-70,[]]},\"evals\":[],\"jsHooks\":[]}m %>% clearBounds() # world view {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}}},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]}]},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/map-options.html","id":null,"dir":"Reference","previous_headings":"","what":"Extra options for map elements and layers — tileOptions","title":"Extra options for map elements and layers — tileOptions","text":"rest possible options map elements layers listed layer functions.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-options.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Extra options for map elements and layers — tileOptions","text":"","code":"tileOptions( minZoom = 0, maxZoom = 18, maxNativeZoom = NULL, tileSize = 256, subdomains = \"abc\", errorTileUrl = \"\", tms = FALSE, noWrap = FALSE, zoomOffset = 0, zoomReverse = FALSE, opacity = 1, zIndex = 1, unloadInvisibleTiles = NULL, updateWhenIdle = NULL, detectRetina = FALSE, ... ) gridOptions( tileSize = 256, updateWhenIdle = NULL, zIndex = 1, minZoom = 0, maxZoom = NULL, ... ) WMSTileOptions( styles = \"\", format = \"image/jpeg\", transparent = FALSE, version = \"1.1.1\", crs = NULL, ... ) popupOptions( maxWidth = 300, minWidth = 50, maxHeight = NULL, autoPan = TRUE, keepInView = FALSE, closeButton = TRUE, zoomAnimation = NULL, closeOnClick = NULL, className = \"\", ... ) labelOptions( interactive = FALSE, clickable = NULL, noHide = NULL, permanent = FALSE, className = \"\", direction = \"auto\", offset = c(0, 0), opacity = 1, textsize = \"10px\", textOnly = FALSE, style = NULL, zoomAnimation = NULL, sticky = TRUE, ... ) markerOptions( interactive = TRUE, clickable = NULL, draggable = FALSE, keyboard = TRUE, title = \"\", alt = \"\", zIndexOffset = 0, opacity = 1, riseOnHover = FALSE, riseOffset = 250, ... ) markerClusterOptions( showCoverageOnHover = TRUE, zoomToBoundsOnClick = TRUE, spiderfyOnMaxZoom = TRUE, removeOutsideVisibleBounds = TRUE, spiderLegPolylineOptions = list(weight = 1.5, color = \"#222\", opacity = 0.5), freezeAtZoom = FALSE, ... ) pathOptions( lineCap = NULL, lineJoin = NULL, clickable = NULL, interactive = TRUE, pointerEvents = NULL, className = \"\", ... )"},{"path":"https://rstudio.github.io/leaflet/reference/map-options.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Extra options for map elements and layers — tileOptions","text":"minZoom, maxZoom, maxNativeZoom, tileSize, subdomains, errorTileUrl, tms, noWrap, zoomOffset, zoomReverse, zIndex, unloadInvisibleTiles, updateWhenIdle, detectRetina tile layer options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tilelayer opacity Tooltip container opacity. Ranges 0 1. Default value 1 (different leaflet.js 0.9); see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tooltip-opacity ... extra options passed underlying JavaScript object constructor. styles comma-separated list WMS styles format WMS image format (use \"image/png\" layers transparency) transparent TRUE, WMS service return images transparency version version WMS service use crs Coordinate Reference System use WMS requests, defaults. maxWidth, minWidth, maxHeight, autoPan, keepInView, closeButton, closeOnClick popup options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#popup-option zoomAnimation deprecated. See https://github.com/Leaflet/Leaflet/blob/master/CHANGELOG.md#api-changes-5 className CSS class name set element interactive whether element emits mouse events clickable DEPRECATED! Use interactive argument. noHide, direction, offset, permanent label options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tooltip-option textsize Change text size single tooltip textOnly Display text, regular surrounding box. style list css style added tooltip sticky true, tooltip follow mouse instead fixed feature center. Default value TRUE (different leaflet.js FALSE); see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#tooltip-sticky draggable, keyboard, title, alt, zIndexOffset, riseOnHover, riseOffset marker options; see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#marker-option showCoverageOnHover mouse cluster shows bounds markers zoomToBoundsOnClick click cluster zoom bounds spiderfyOnMaxZoom click cluster bottom zoom level spiderfy can see markers removeOutsideVisibleBounds clusters markers far viewport removed map performance spiderLegPolylineOptions Allows specify PolylineOptions style spider legs. default, {weight: 1.5, color: \"#222\", opacity: 0.5 }. freezeAtZoom Allows freeze cluster expansion zoom level. Can zoom level e.g., 10, 12 \"max\" \"maxKeepSpiderify\". See https://github.com/ghybs/Leaflet.MarkerCluster.Freezable#api-reference. lineCap string defines shape used end stroke. lineJoin string defines shape used corners stroke. pointerEvents sets pointer-events attribute path SVG backend used","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-options.html","id":"functions","dir":"Reference","previous_headings":"","what":"Functions","title":"Extra options for map elements and layers — tileOptions","text":"tileOptions(): Options tile layers gridOptions(): Options grid layers WMSTileOptions(): Options WMS tile layers popupOptions(): Options popups labelOptions(): Options labels markerOptions(): Options markers markerClusterOptions(): Options marker clusters pathOptions(): Options vector layers (polylines, polygons, rectangles, circles, etc)","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/map-shiny.html","id":null,"dir":"Reference","previous_headings":"","what":"Wrapper functions for using leaflet in shiny — leafletOutput","title":"Wrapper functions for using leaflet in shiny — leafletOutput","text":"Use leafletOutput() create UI element, renderLeaflet() render map widget.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-shiny.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Wrapper functions for using leaflet in shiny — leafletOutput","text":"","code":"leafletOutput(outputId, width = \"100%\", height = 400) renderLeaflet(expr, env = parent.frame(), quoted = FALSE)"},{"path":"https://rstudio.github.io/leaflet/reference/map-shiny.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Wrapper functions for using leaflet in shiny — leafletOutput","text":"outputId output variable read width, height width height map (see htmlwidgets::shinyWidgetOutput()) expr expression generates HTML widget (promise HTML widget). env environment evaluate expr. quoted expr quoted expression (quote())? useful want save expression variable.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/map-shiny.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Wrapper functions for using leaflet in shiny — leafletOutput","text":"","code":"# !formatR library(shiny) app <- shinyApp( ui = fluidPage(leafletOutput('myMap')), server = function(input, output) { map = leaflet() %>% addTiles() %>% setView(-93.65, 42.0285, zoom = 17) output$myMap = renderLeaflet(map) } ) if (interactive()) app"},{"path":"https://rstudio.github.io/leaflet/reference/mapOptions.html","id":null,"dir":"Reference","previous_headings":"","what":"Set options on a leaflet map object — mapOptions","title":"Set options on a leaflet map object — mapOptions","text":"Set options leaflet map object","code":""},{"path":"https://rstudio.github.io/leaflet/reference/mapOptions.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Set options on a leaflet map object — mapOptions","text":"","code":"mapOptions(map, zoomToLimits = c(\"always\", \"first\", \"never\"))"},{"path":"https://rstudio.github.io/leaflet/reference/mapOptions.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Set options on a leaflet map object — mapOptions","text":"map map widget object created leaflet() zoomToLimits Controls whether map zooms limits elements map. useful interactive applications map data updated. \"always\" (default), map always re-zooms new data received; \"first\", zooms elements first rendering, re-zoom subsequent data; \"never\", never re-zooms, even first rendering.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/mapOptions.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Set options on a leaflet map object — mapOptions","text":"","code":"# Don't auto-zoom to the objects (can be useful in interactive applications) leaflet() %>% addTiles() %>% addPopups(174.7690922, -36.8523071, \"R was born here!\") %>% mapOptions(zoomToLimits = \"first\") {\"x\":{\"options\":{\"crs\":{\"crsClass\":\"L.CRS.EPSG3857\",\"code\":null,\"proj4def\":null,\"projectedBounds\":null,\"options\":{}},\"zoomToLimits\":\"first\"},\"calls\":[{\"method\":\"addTiles\",\"args\":[\"https://{s}.tile.openstreetmap.org/{z}/{x}/{y}.png\",null,null,{\"minZoom\":0,\"maxZoom\":18,\"tileSize\":256,\"subdomains\":\"abc\",\"errorTileUrl\":\"\",\"tms\":false,\"noWrap\":false,\"zoomOffset\":0,\"zoomReverse\":false,\"opacity\":1,\"zIndex\":1,\"detectRetina\":false,\"attribution\":\"© OpenStreetMap<\\/a>, ODbL<\\/a>\"}]},{\"method\":\"addPopups\",\"args\":[-36.8523071,174.7690922,\"R was born here!\",null,null,{\"maxWidth\":300,\"minWidth\":50,\"autoPan\":true,\"keepInView\":false,\"closeButton\":true,\"className\":\"\"}]}],\"limits\":{\"lat\":[-36.8523071,-36.8523071],\"lng\":[174.7690922,174.7690922]}},\"evals\":[],\"jsHooks\":[]}"},{"path":"https://rstudio.github.io/leaflet/reference/previewColors.html","id":null,"dir":"Reference","previous_headings":"","what":"Color previewing utility — previewColors","title":"Color previewing utility — previewColors","text":"Color previewing utility","code":""},{"path":"https://rstudio.github.io/leaflet/reference/previewColors.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Color previewing utility — previewColors","text":"","code":"previewColors(pal, values)"},{"path":"https://rstudio.github.io/leaflet/reference/previewColors.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Color previewing utility — previewColors","text":"pal color mapping function, like returned colorNumeric(), et al values set values preview colors ","code":""},{"path":"https://rstudio.github.io/leaflet/reference/previewColors.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Color previewing utility — previewColors","text":"HTML-based list colors values","code":""},{"path":"https://rstudio.github.io/leaflet/reference/providers.html","id":null,"dir":"Reference","previous_headings":"","what":"Providers — providers","title":"Providers — providers","text":"List providers variations","code":""},{"path":"https://rstudio.github.io/leaflet/reference/providers.html","id":"format","dir":"Reference","previous_headings":"","what":"Format","title":"Providers — providers","text":"list characters","code":""},{"path":"https://rstudio.github.io/leaflet/reference/providers.html","id":"source","dir":"Reference","previous_headings":"","what":"Source","title":"Providers — providers","text":"https://github.com/leaflet-extras/leaflet-providers/blob/0a9e27f8c6c26956b4e78c26e1945d748e3c2869/leaflet-providers.js","code":""},{"path":"https://rstudio.github.io/leaflet/reference/providers.html","id":"ref-examples","dir":"Reference","previous_headings":"","what":"Examples","title":"Providers — providers","text":"","code":"providers #> $OpenStreetMap #> [1] \"OpenStreetMap\" #> #> $OpenStreetMap.Mapnik #> [1] \"OpenStreetMap.Mapnik\" #> #> $OpenStreetMap.DE #> [1] \"OpenStreetMap.DE\" #> #> $OpenStreetMap.CH #> [1] \"OpenStreetMap.CH\" #> #> $OpenStreetMap.France #> [1] \"OpenStreetMap.France\" #> #> $OpenStreetMap.HOT #> [1] \"OpenStreetMap.HOT\" #> #> $OpenStreetMap.BZH #> [1] \"OpenStreetMap.BZH\" #> #> $MapTilesAPI #> [1] \"MapTilesAPI\" #> #> $MapTilesAPI.OSMEnglish #> [1] \"MapTilesAPI.OSMEnglish\" #> #> $MapTilesAPI.OSMFrancais #> [1] \"MapTilesAPI.OSMFrancais\" #> #> $MapTilesAPI.OSMEspagnol #> [1] \"MapTilesAPI.OSMEspagnol\" #> #> $OpenSeaMap #> [1] \"OpenSeaMap\" #> #> $OPNVKarte #> [1] \"OPNVKarte\" #> #> $OpenTopoMap #> [1] \"OpenTopoMap\" #> #> $OpenRailwayMap #> [1] \"OpenRailwayMap\" #> #> $OpenFireMap #> [1] \"OpenFireMap\" #> #> $SafeCast #> [1] \"SafeCast\" #> #> $Stadia #> [1] \"Stadia\" #> #> $Stadia.AlidadeSmooth #> [1] \"Stadia.AlidadeSmooth\" #> #> $Stadia.AlidadeSmoothDark #> [1] \"Stadia.AlidadeSmoothDark\" #> #> $Stadia.OSMBright #> [1] \"Stadia.OSMBright\" #> #> $Stadia.Outdoors #> [1] \"Stadia.Outdoors\" #> #> $Stadia.StamenToner #> [1] \"Stadia.StamenToner\" #> #> $Stadia.StamenTonerBackground #> [1] \"Stadia.StamenTonerBackground\" #> #> $Stadia.StamenTonerLines #> [1] \"Stadia.StamenTonerLines\" #> #> $Stadia.StamenTonerLabels #> [1] \"Stadia.StamenTonerLabels\" #> #> $Stadia.StamenTonerLite #> [1] \"Stadia.StamenTonerLite\" #> #> $Stadia.StamenWatercolor #> [1] \"Stadia.StamenWatercolor\" #> #> $Stadia.StamenTerrain #> [1] \"Stadia.StamenTerrain\" #> #> $Stadia.StamenTerrainBackground #> [1] \"Stadia.StamenTerrainBackground\" #> #> $Stadia.StamenTerrainLabels #> [1] \"Stadia.StamenTerrainLabels\" #> #> $Stadia.StamenTerrainLines #> [1] \"Stadia.StamenTerrainLines\" #> #> $Thunderforest #> [1] \"Thunderforest\" #> #> $Thunderforest.OpenCycleMap #> [1] \"Thunderforest.OpenCycleMap\" #> #> $Thunderforest.Transport #> [1] \"Thunderforest.Transport\" #> #> $Thunderforest.TransportDark #> [1] \"Thunderforest.TransportDark\" #> #> $Thunderforest.SpinalMap #> [1] \"Thunderforest.SpinalMap\" #> #> $Thunderforest.Landscape #> [1] \"Thunderforest.Landscape\" #> #> $Thunderforest.Outdoors #> [1] \"Thunderforest.Outdoors\" #> #> $Thunderforest.Pioneer #> [1] \"Thunderforest.Pioneer\" #> #> $Thunderforest.MobileAtlas #> [1] \"Thunderforest.MobileAtlas\" #> #> $Thunderforest.Neighbourhood #> [1] \"Thunderforest.Neighbourhood\" #> #> $CyclOSM #> [1] \"CyclOSM\" #> #> $Jawg #> [1] \"Jawg\" #> #> $Jawg.Streets #> [1] \"Jawg.Streets\" #> #> $Jawg.Terrain #> [1] \"Jawg.Terrain\" #> #> $Jawg.Sunny #> [1] \"Jawg.Sunny\" #> #> $Jawg.Dark #> [1] \"Jawg.Dark\" #> #> $Jawg.Light #> [1] \"Jawg.Light\" #> #> $Jawg.Matrix #> [1] \"Jawg.Matrix\" #> #> $MapBox #> [1] \"MapBox\" #> #> $MapTiler #> [1] \"MapTiler\" #> #> $MapTiler.Streets #> [1] \"MapTiler.Streets\" #> #> $MapTiler.Basic #> [1] \"MapTiler.Basic\" #> #> $MapTiler.Bright #> [1] \"MapTiler.Bright\" #> #> $MapTiler.Pastel #> [1] \"MapTiler.Pastel\" #> #> $MapTiler.Positron #> [1] \"MapTiler.Positron\" #> #> $MapTiler.Hybrid #> [1] \"MapTiler.Hybrid\" #> #> $MapTiler.Toner #> [1] \"MapTiler.Toner\" #> #> $MapTiler.Topo #> [1] \"MapTiler.Topo\" #> #> $MapTiler.Voyager #> [1] \"MapTiler.Voyager\" #> #> $TomTom #> [1] \"TomTom\" #> #> $TomTom.Basic #> [1] \"TomTom.Basic\" #> #> $TomTom.Hybrid #> [1] \"TomTom.Hybrid\" #> #> $TomTom.Labels #> [1] \"TomTom.Labels\" #> #> $Esri #> [1] \"Esri\" #> #> $Esri.WorldStreetMap #> [1] \"Esri.WorldStreetMap\" #> #> $Esri.DeLorme #> [1] \"Esri.DeLorme\" #> #> $Esri.WorldTopoMap #> [1] \"Esri.WorldTopoMap\" #> #> $Esri.WorldImagery #> [1] \"Esri.WorldImagery\" #> #> $Esri.WorldTerrain #> [1] \"Esri.WorldTerrain\" #> #> $Esri.WorldShadedRelief #> [1] \"Esri.WorldShadedRelief\" #> #> $Esri.WorldPhysical #> [1] \"Esri.WorldPhysical\" #> #> $Esri.OceanBasemap #> [1] \"Esri.OceanBasemap\" #> #> $Esri.NatGeoWorldMap #> [1] \"Esri.NatGeoWorldMap\" #> #> $Esri.WorldGrayCanvas #> [1] \"Esri.WorldGrayCanvas\" #> #> $OpenWeatherMap #> [1] \"OpenWeatherMap\" #> #> $OpenWeatherMap.Clouds #> [1] \"OpenWeatherMap.Clouds\" #> #> $OpenWeatherMap.CloudsClassic #> [1] \"OpenWeatherMap.CloudsClassic\" #> #> $OpenWeatherMap.Precipitation #> [1] \"OpenWeatherMap.Precipitation\" #> #> $OpenWeatherMap.PrecipitationClassic #> [1] \"OpenWeatherMap.PrecipitationClassic\" #> #> $OpenWeatherMap.Rain #> [1] \"OpenWeatherMap.Rain\" #> #> $OpenWeatherMap.RainClassic #> [1] \"OpenWeatherMap.RainClassic\" #> #> $OpenWeatherMap.Pressure #> [1] \"OpenWeatherMap.Pressure\" #> #> $OpenWeatherMap.PressureContour #> [1] \"OpenWeatherMap.PressureContour\" #> #> $OpenWeatherMap.Wind #> [1] \"OpenWeatherMap.Wind\" #> #> $OpenWeatherMap.Temperature #> [1] \"OpenWeatherMap.Temperature\" #> #> $OpenWeatherMap.Snow #> [1] \"OpenWeatherMap.Snow\" #> #> $HERE #> [1] \"HERE\" #> #> $HERE.normalDay #> [1] \"HERE.normalDay\" #> #> $HERE.normalDayCustom #> [1] \"HERE.normalDayCustom\" #> #> $HERE.normalDayGrey #> [1] \"HERE.normalDayGrey\" #> #> $HERE.normalDayMobile #> [1] \"HERE.normalDayMobile\" #> #> $HERE.normalDayGreyMobile #> [1] \"HERE.normalDayGreyMobile\" #> #> $HERE.normalDayTransit #> [1] \"HERE.normalDayTransit\" #> #> $HERE.normalDayTransitMobile #> [1] \"HERE.normalDayTransitMobile\" #> #> $HERE.normalDayTraffic #> [1] \"HERE.normalDayTraffic\" #> #> $HERE.normalNight #> [1] \"HERE.normalNight\" #> #> $HERE.normalNightMobile #> [1] \"HERE.normalNightMobile\" #> #> $HERE.normalNightGrey #> [1] \"HERE.normalNightGrey\" #> #> $HERE.normalNightGreyMobile #> [1] \"HERE.normalNightGreyMobile\" #> #> $HERE.normalNightTransit #> [1] \"HERE.normalNightTransit\" #> #> $HERE.normalNightTransitMobile #> [1] \"HERE.normalNightTransitMobile\" #> #> $HERE.reducedDay #> [1] \"HERE.reducedDay\" #> #> $HERE.reducedNight #> [1] \"HERE.reducedNight\" #> #> $HERE.basicMap #> [1] \"HERE.basicMap\" #> #> $HERE.mapLabels #> [1] \"HERE.mapLabels\" #> #> $HERE.trafficFlow #> [1] \"HERE.trafficFlow\" #> #> $HERE.carnavDayGrey #> [1] \"HERE.carnavDayGrey\" #> #> $HERE.hybridDay #> [1] \"HERE.hybridDay\" #> #> $HERE.hybridDayMobile #> [1] \"HERE.hybridDayMobile\" #> #> $HERE.hybridDayTransit #> [1] \"HERE.hybridDayTransit\" #> #> $HERE.hybridDayGrey #> [1] \"HERE.hybridDayGrey\" #> #> $HERE.hybridDayTraffic #> [1] \"HERE.hybridDayTraffic\" #> #> $HERE.pedestrianDay #> [1] \"HERE.pedestrianDay\" #> #> $HERE.pedestrianNight #> [1] \"HERE.pedestrianNight\" #> #> $HERE.satelliteDay #> [1] \"HERE.satelliteDay\" #> #> $HERE.terrainDay #> [1] \"HERE.terrainDay\" #> #> $HERE.terrainDayMobile #> [1] \"HERE.terrainDayMobile\" #> #> $HEREv3 #> [1] \"HEREv3\" #> #> $HEREv3.normalDay #> [1] \"HEREv3.normalDay\" #> #> $HEREv3.normalDayCustom #> [1] \"HEREv3.normalDayCustom\" #> #> $HEREv3.normalDayGrey #> [1] \"HEREv3.normalDayGrey\" #> #> $HEREv3.normalDayMobile #> [1] \"HEREv3.normalDayMobile\" #> #> $HEREv3.normalDayGreyMobile #> [1] \"HEREv3.normalDayGreyMobile\" #> #> $HEREv3.normalDayTransit #> [1] \"HEREv3.normalDayTransit\" #> #> $HEREv3.normalDayTransitMobile #> [1] \"HEREv3.normalDayTransitMobile\" #> #> $HEREv3.normalNight #> [1] \"HEREv3.normalNight\" #> #> $HEREv3.normalNightMobile #> [1] \"HEREv3.normalNightMobile\" #> #> $HEREv3.normalNightGrey #> [1] \"HEREv3.normalNightGrey\" #> #> $HEREv3.normalNightGreyMobile #> [1] \"HEREv3.normalNightGreyMobile\" #> #> $HEREv3.normalNightTransit #> [1] \"HEREv3.normalNightTransit\" #> #> $HEREv3.normalNightTransitMobile #> [1] \"HEREv3.normalNightTransitMobile\" #> #> $HEREv3.reducedDay #> [1] \"HEREv3.reducedDay\" #> #> $HEREv3.reducedNight #> [1] \"HEREv3.reducedNight\" #> #> $HEREv3.basicMap #> [1] \"HEREv3.basicMap\" #> #> $HEREv3.mapLabels #> [1] \"HEREv3.mapLabels\" #> #> $HEREv3.trafficFlow #> [1] \"HEREv3.trafficFlow\" #> #> $HEREv3.carnavDayGrey #> [1] \"HEREv3.carnavDayGrey\" #> #> $HEREv3.hybridDay #> [1] \"HEREv3.hybridDay\" #> #> $HEREv3.hybridDayMobile #> [1] \"HEREv3.hybridDayMobile\" #> #> $HEREv3.hybridDayTransit #> [1] \"HEREv3.hybridDayTransit\" #> #> $HEREv3.hybridDayGrey #> [1] \"HEREv3.hybridDayGrey\" #> #> $HEREv3.pedestrianDay #> [1] \"HEREv3.pedestrianDay\" #> #> $HEREv3.pedestrianNight #> [1] \"HEREv3.pedestrianNight\" #> #> $HEREv3.satelliteDay #> [1] \"HEREv3.satelliteDay\" #> #> $HEREv3.terrainDay #> [1] \"HEREv3.terrainDay\" #> #> $HEREv3.terrainDayMobile #> [1] \"HEREv3.terrainDayMobile\" #> #> $FreeMapSK #> [1] \"FreeMapSK\" #> #> $MtbMap #> [1] \"MtbMap\" #> #> $CartoDB #> [1] \"CartoDB\" #> #> $CartoDB.Positron #> [1] \"CartoDB.Positron\" #> #> $CartoDB.PositronNoLabels #> [1] \"CartoDB.PositronNoLabels\" #> #> $CartoDB.PositronOnlyLabels #> [1] \"CartoDB.PositronOnlyLabels\" #> #> $CartoDB.DarkMatter #> [1] \"CartoDB.DarkMatter\" #> #> $CartoDB.DarkMatterNoLabels #> [1] \"CartoDB.DarkMatterNoLabels\" #> #> $CartoDB.DarkMatterOnlyLabels #> [1] \"CartoDB.DarkMatterOnlyLabels\" #> #> $CartoDB.Voyager #> [1] \"CartoDB.Voyager\" #> #> $CartoDB.VoyagerNoLabels #> [1] \"CartoDB.VoyagerNoLabels\" #> #> $CartoDB.VoyagerOnlyLabels #> [1] \"CartoDB.VoyagerOnlyLabels\" #> #> $CartoDB.VoyagerLabelsUnder #> [1] \"CartoDB.VoyagerLabelsUnder\" #> #> $HikeBike #> [1] \"HikeBike\" #> #> $HikeBike.HikeBike #> [1] \"HikeBike.HikeBike\" #> #> $HikeBike.HillShading #> [1] \"HikeBike.HillShading\" #> #> $BasemapAT #> [1] \"BasemapAT\" #> #> $BasemapAT.basemap #> [1] \"BasemapAT.basemap\" #> #> $BasemapAT.grau #> [1] \"BasemapAT.grau\" #> #> $BasemapAT.overlay #> [1] \"BasemapAT.overlay\" #> #> $BasemapAT.terrain #> [1] \"BasemapAT.terrain\" #> #> $BasemapAT.surface #> [1] \"BasemapAT.surface\" #> #> $BasemapAT.highdpi #> [1] \"BasemapAT.highdpi\" #> #> $BasemapAT.orthofoto #> [1] \"BasemapAT.orthofoto\" #> #> $nlmaps #> [1] \"nlmaps\" #> #> $nlmaps.standaard #> [1] \"nlmaps.standaard\" #> #> $nlmaps.pastel #> [1] \"nlmaps.pastel\" #> #> $nlmaps.grijs #> [1] \"nlmaps.grijs\" #> #> $nlmaps.water #> [1] \"nlmaps.water\" #> #> $nlmaps.luchtfoto #> [1] \"nlmaps.luchtfoto\" #> #> $NASAGIBS #> [1] \"NASAGIBS\" #> #> $NASAGIBS.ModisTerraTrueColorCR #> [1] \"NASAGIBS.ModisTerraTrueColorCR\" #> #> $NASAGIBS.ModisTerraBands367CR #> [1] \"NASAGIBS.ModisTerraBands367CR\" #> #> $NASAGIBS.ViirsEarthAtNight2012 #> [1] \"NASAGIBS.ViirsEarthAtNight2012\" #> #> $NASAGIBS.ModisTerraLSTDay #> [1] \"NASAGIBS.ModisTerraLSTDay\" #> #> $NASAGIBS.ModisTerraSnowCover #> [1] \"NASAGIBS.ModisTerraSnowCover\" #> #> $NASAGIBS.ModisTerraAOD #> [1] \"NASAGIBS.ModisTerraAOD\" #> #> $NASAGIBS.ModisTerraChlorophyll #> [1] \"NASAGIBS.ModisTerraChlorophyll\" #> #> $NLS #> [1] \"NLS\" #> #> $JusticeMap #> [1] \"JusticeMap\" #> #> $JusticeMap.income #> [1] \"JusticeMap.income\" #> #> $JusticeMap.americanIndian #> [1] \"JusticeMap.americanIndian\" #> #> $JusticeMap.asian #> [1] \"JusticeMap.asian\" #> #> $JusticeMap.black #> [1] \"JusticeMap.black\" #> #> $JusticeMap.hispanic #> [1] \"JusticeMap.hispanic\" #> #> $JusticeMap.multi #> [1] \"JusticeMap.multi\" #> #> $JusticeMap.nonWhite #> [1] \"JusticeMap.nonWhite\" #> #> $JusticeMap.white #> [1] \"JusticeMap.white\" #> #> $JusticeMap.plurality #> [1] \"JusticeMap.plurality\" #> #> $GeoportailFrance #> [1] \"GeoportailFrance\" #> #> $GeoportailFrance.plan #> [1] \"GeoportailFrance.plan\" #> #> $GeoportailFrance.parcels #> [1] \"GeoportailFrance.parcels\" #> #> $GeoportailFrance.orthos #> [1] \"GeoportailFrance.orthos\" #> #> $OneMapSG #> [1] \"OneMapSG\" #> #> $OneMapSG.Default #> [1] \"OneMapSG.Default\" #> #> $OneMapSG.Night #> [1] \"OneMapSG.Night\" #> #> $OneMapSG.Original #> [1] \"OneMapSG.Original\" #> #> $OneMapSG.Grey #> [1] \"OneMapSG.Grey\" #> #> $OneMapSG.LandLot #> [1] \"OneMapSG.LandLot\" #> #> $USGS #> [1] \"USGS\" #> #> $USGS.USTopo #> [1] \"USGS.USTopo\" #> #> $USGS.USImagery #> [1] \"USGS.USImagery\" #> #> $USGS.USImageryTopo #> [1] \"USGS.USImageryTopo\" #> #> $WaymarkedTrails #> [1] \"WaymarkedTrails\" #> #> $WaymarkedTrails.hiking #> [1] \"WaymarkedTrails.hiking\" #> #> $WaymarkedTrails.cycling #> [1] \"WaymarkedTrails.cycling\" #> #> $WaymarkedTrails.mtb #> [1] \"WaymarkedTrails.mtb\" #> #> $WaymarkedTrails.slopes #> [1] \"WaymarkedTrails.slopes\" #> #> $WaymarkedTrails.riding #> [1] \"WaymarkedTrails.riding\" #> #> $WaymarkedTrails.skating #> [1] \"WaymarkedTrails.skating\" #> #> $OpenAIP #> [1] \"OpenAIP\" #> #> $OpenSnowMap #> [1] \"OpenSnowMap\" #> #> $OpenSnowMap.pistes #> [1] \"OpenSnowMap.pistes\" #> #> $AzureMaps #> [1] \"AzureMaps\" #> #> $AzureMaps.MicrosoftImagery #> [1] \"AzureMaps.MicrosoftImagery\" #> #> $AzureMaps.MicrosoftBaseDarkGrey #> [1] \"AzureMaps.MicrosoftBaseDarkGrey\" #> #> $AzureMaps.MicrosoftBaseRoad #> [1] \"AzureMaps.MicrosoftBaseRoad\" #> #> $AzureMaps.MicrosoftBaseHybridRoad #> [1] \"AzureMaps.MicrosoftBaseHybridRoad\" #> #> $AzureMaps.MicrosoftTerraMain #> [1] \"AzureMaps.MicrosoftTerraMain\" #> #> $AzureMaps.MicrosoftWeatherInfraredMain #> [1] \"AzureMaps.MicrosoftWeatherInfraredMain\" #> #> $AzureMaps.MicrosoftWeatherRadarMain #> [1] \"AzureMaps.MicrosoftWeatherRadarMain\" #> #> $SwissFederalGeoportal #> [1] \"SwissFederalGeoportal\" #> #> $SwissFederalGeoportal.NationalMapColor #> [1] \"SwissFederalGeoportal.NationalMapColor\" #> #> $SwissFederalGeoportal.NationalMapGrey #> [1] \"SwissFederalGeoportal.NationalMapGrey\" #> #> $SwissFederalGeoportal.SWISSIMAGE #> [1] \"SwissFederalGeoportal.SWISSIMAGE\" #>"},{"path":"https://rstudio.github.io/leaflet/reference/reexports.html","id":null,"dir":"Reference","previous_headings":"","what":"Objects exported from other packages — reexports","title":"Objects exported from other packages — reexports","text":"objects imported packages. Follow links see documentation. htmlwidgets JS magrittr %>%","code":""},{"path":"https://rstudio.github.io/leaflet/reference/remove.html","id":null,"dir":"Reference","previous_headings":"","what":"Remove elements from a map — removeControl","title":"Remove elements from a map — removeControl","text":"Remove one features map, identified layerId; , clear features given type group.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/remove.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Remove elements from a map — removeControl","text":"","code":"removeControl(map, layerId) clearControls(map) clearGroup(map, group) removeImage(map, layerId) clearImages(map) removeTiles(map, layerId) clearTiles(map) removePopup(map, layerId) clearPopups(map) removeMarker(map, layerId) clearMarkers(map) removeMarkerCluster(map, layerId) clearMarkerClusters(map) removeMarkerFromCluster(map, layerId, clusterId) removeShape(map, layerId) clearShapes(map) removeGeoJSON(map, layerId) clearGeoJSON(map) removeMeasure(map) removeTopoJSON(map, layerId) clearTopoJSON(map)"},{"path":"https://rstudio.github.io/leaflet/reference/remove.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Remove elements from a map — removeControl","text":"map map widget object, possibly created leaflet() likely leafletProxy() layerId character vector; layer id(s) item remove group name group whose members removed clusterId id marker cluster layer","code":""},{"path":"https://rstudio.github.io/leaflet/reference/remove.html","id":"value","dir":"Reference","previous_headings":"","what":"Value","title":"Remove elements from a map — removeControl","text":"new map object","code":""},{"path":"https://rstudio.github.io/leaflet/reference/remove.html","id":"note","dir":"Reference","previous_headings":"","what":"Note","title":"Remove elements from a map — removeControl","text":"used leaflet map object, functions actually remove features map object, simply add operation cause features removed added. words, add polygon \"foo\" call removeShape(\"foo\"), smart enough prevent polygon added first place; instead, map rendered, polygon added removed. reason, functions useful leaflet map objects really intended used leafletProxy() instead. WMS tile layers extensions tile layers, can also removed cleared via removeTiles() clearTiles().","code":""},{"path":"https://rstudio.github.io/leaflet/reference/safeLabel.html","id":null,"dir":"Reference","previous_headings":"","what":"Sanitize textual labels — safeLabel","title":"Sanitize textual labels — safeLabel","text":"helper function used internally HTML-escape user-provided labels. prevents strings unintentionally treated HTML intended plaintext.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/safeLabel.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Sanitize textual labels — safeLabel","text":"","code":"safeLabel(label, data)"},{"path":"https://rstudio.github.io/leaflet/reference/safeLabel.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Sanitize textual labels — safeLabel","text":"label vector list plain characters HTML (marked htmltools::HTML()), formula resolves value. data data frame formula evaluated.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/showGroup.html","id":null,"dir":"Reference","previous_headings":"","what":"Show or hide layer groups — showGroup","title":"Show or hide layer groups — showGroup","text":"Hide groups layers without removing map entirely. Groups created using group parameter included layer adding functions.","code":""},{"path":"https://rstudio.github.io/leaflet/reference/showGroup.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Show or hide layer groups — showGroup","text":"","code":"showGroup(map, group) hideGroup(map, group)"},{"path":"https://rstudio.github.io/leaflet/reference/showGroup.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Show or hide layer groups — showGroup","text":"map map modify group character vector one group names show hide","code":""},{"path":[]},{"path":"https://rstudio.github.io/leaflet/reference/validateCoords.html","id":null,"dir":"Reference","previous_headings":"","what":"Utility function to check if a coordinates is valid — validateCoords","title":"Utility function to check if a coordinates is valid — validateCoords","text":"Utility function check coordinates valid","code":""},{"path":"https://rstudio.github.io/leaflet/reference/validateCoords.html","id":"ref-usage","dir":"Reference","previous_headings":"","what":"Usage","title":"Utility function to check if a coordinates is valid — validateCoords","text":"","code":"validateCoords(lng, lat, funcName, warn = TRUE, mode = c(\"point\", \"polygon\"))"},{"path":"https://rstudio.github.io/leaflet/reference/validateCoords.html","id":"arguments","dir":"Reference","previous_headings":"","what":"Arguments","title":"Utility function to check if a coordinates is valid — validateCoords","text":"lng vector longitude values lat vector latitude values funcName Name calling function warn boolean. Whether generate warning message rows missing/invalid data mode \"point\" warn NA lng/lat values; \"polygon\" NA values expected used polygon delimiters","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-development-version","dir":"Changelog","previous_headings":"","what":"leaflet (development version)","title":"leaflet (development version)","text":"Color palette improvements. color palette functions now support viridisLite palettes (“magma”, “inferno”, “plasma”, “viridis”, “cividis”, “rocket”, “mako”, “turbo”) (@jack-davison, #924). Updated vignettes replace sp/raster usage sf/terra corresponding examples. (@jack-davison, #928) Updated vignettes replace sp/raster usage sf/`{terra} corresponding examples. (@jack-davison, #928) addProviderTiles() now error chosen provider match currently loaded provider (default, providers). behaviour can toggled setting new check argument FALSE (@jack-davison, #929)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-222","dir":"Changelog","previous_headings":"","what":"leaflet 2.2.2","title":"leaflet 2.2.2","text":"CRAN release: 2024-03-26 Fixed #893: Correctly call terra::crs() checking CRS SpatVector object pointData() polygonData() (thanks @mkoohafkan, #894). leaflet now brand new pkgdown site (@olivroy, #902) Replace viridis dependency viridisLite (@olivroy, #897) addRasterImage now takes options = gridOptions(), arbitrary Leaflet layer options can controlled. (#692)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-221","dir":"Changelog","previous_headings":"","what":"leaflet 2.2.1","title":"leaflet 2.2.1","text":"CRAN release: 2023-11-13 addProviderTiles() used leaflet.providers version 2.0.0 later, leaflet-providers HTML dependency produced can correctly cached knitr. used older versions leaflet.providers, HTML dependency uses temp files break knitr’s caching mechanism (thanks @qdread, @jaredlander; #884).","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-220","dir":"Changelog","previous_headings":"","what":"leaflet 2.2.0","title":"leaflet 2.2.0","text":"CRAN release: 2023-08-31","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"features-2-2-0","dir":"Changelog","previous_headings":"","what":"Features","title":"leaflet 2.2.0","text":"Added support SpatRaster SpatVector objects terra package. (#728) leaflet() now uses jQuery 3.6.0 provided via {jquerylib}package. result change, HTML dependencies leaflet() included dependencies item htmlwidget object returns. (#817, #821)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-2-0","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.2.0","text":"Use correct license OpenStreetMap attribution. (#811) Use xfun::base64_uri() base64 encoding instead markdown base64enc. (#823) Remove dependencies rgdal rgeos. (#837) Respect option scrollWheelZoom=FALSE. (#827) Fixed #866: Correctly call terra::.RGB() addRasterImage() SpatRaster object. (#869)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-212","dir":"Changelog","previous_headings":"","what":"leaflet 2.1.2","title":"leaflet 2.1.2","text":"CRAN release: 2023-03-10","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-1-2","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.1.2","text":"Removed S3 warnings found R devel (#848)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-211","dir":"Changelog","previous_headings":"","what":"leaflet 2.1.1","title":"leaflet 2.1.1","text":"CRAN release: 2022-03-23","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-1-1","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.1.1","text":"default marker icon addMarkers longer worked, due CDN relying apparently retired. Fixed pointing new CDN. (#782) New behavior tile.openstreetmap.org caused addTiles default tileset break viewed non-https protocol recent versions Chrome. Fixed always using https protocol connect openstreetmap. (#786)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-210","dir":"Changelog","previous_headings":"","what":"leaflet 2.1.0","title":"leaflet 2.1.0","text":"CRAN release: 2022-02-16","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-1-0","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.1.0","text":"Enable JS function literals (wrapped htmlwidgets::JS()) included arguments methods invoked leafletProxy objects. (JS function literals already included methods invoked leaflet objects, change just brings leafletProxy parity.) (#420) Add missing CSS rule show right-pane left-pane (rstudio/rmarkdown#1949, #770) Allow hidden suspended leaflet maps queue calls (add raster images) rendered. new leaflet map created, pending calls removed. (#771)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-2041","dir":"Changelog","previous_headings":"","what":"leaflet 2.0.4.1","title":"leaflet 2.0.4.1","text":"CRAN release: 2021-01-07","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"features-2-0-4-1","dir":"Changelog","previous_headings":"","what":"Features","title":"leaflet 2.0.4.1","text":"Updated proj4.js 2.6.2","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-0-4-1","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.0.4.1","text":"Minor tweaks example data tests, required stay CRAN Fixes broken URL (#742) updated examples run system files (#576) including updated .Rmd .html docs.","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-203","dir":"Changelog","previous_headings":"","what":"leaflet 2.0.3","title":"leaflet 2.0.3","text":"CRAN release: 2019-11-16","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"breaking-changes-2-0-3","dir":"Changelog","previous_headings":"","what":"Breaking changes","title":"leaflet 2.0.3","text":"data(\"providers\") data(\"providers.details\") longer exist. Please use leaflet::providers leaflet::providers.details. (#636)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-0-3","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.0.3","text":"Integrated data leaflet.providers package. See leaflet.providers details. (#636) Fixed rstudio/crosstalk#58, caused Leaflet maps used Crosstalk shared data Shiny apps, redrawn incorrect times. invokeRemote() now resolves html dependencies passing shiny::createWebDependency() (#620). Upgrade leaflet-provider 1.4.0, enable map variants CartoDB.Voyager (#567) sf objects names attributes st_geometry now visualise correctly (#595) GeoJSON objects missing properties can now displayed (#622)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-202","dir":"Changelog","previous_headings":"","what":"leaflet 2.0.2","title":"leaflet 2.0.2","text":"CRAN release: 2018-08-27","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-0-2","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.0.2","text":"Require viridis >= 0.5.1 avoid namespace issues viridisLite (#557) Fixed broken mouse events using leaflet-search leaflet.extras within shiny applications (#563) Use leaflet namespace providers addMiniMap make function accessible packages. Fixes r-tmap/tmap#231. (#568) Require scales >= 1.0.0 avoid exact color matching issues (#578)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-201","dir":"Changelog","previous_headings":"","what":"leaflet 2.0.1","title":"leaflet 2.0.1","text":"CRAN release: 2018-06-04","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"features-2-0-1","dir":"Changelog","previous_headings":"","what":"Features","title":"leaflet 2.0.1","text":"Added method addMapPane add custom pane layers fine tune control layer ordering. New feature within leaflet.js v1.x. (#549) Exposed htmlwidgets sizingPolicy leaflet() (#548)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-improvements-2-0-1","dir":"Changelog","previous_headings":"","what":"Bug fixes and improvements","title":"leaflet 2.0.1","text":"Default marker icon locations now use unpkg.com instead leaflet cdn using https file protocols. (#544) .leaflet-map-pane z-index switched ‘auto’. Allows map panes appear map appear later dom. (#537) Use correct Leaflet.js scale control remove method. (#547) Start world view using flyTo flyToBounds. (#552)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-200","dir":"Changelog","previous_headings":"","what":"leaflet 2.0.0","title":"leaflet 2.0.0","text":"CRAN release: 2018-04-20","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"breaking-changes-2-0-0","dir":"Changelog","previous_headings":"","what":"Breaking changes","title":"leaflet 2.0.0","text":"Update latest leaflet.js v1.3.1 (#453, 314616f) Please see https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html latest documentation plugins updated versions compatible leaflet > 1.0 (#458) jQuery, https://github.com/jquery/jquery Leaflet (JavaScript library), https://github.com/Leaflet/Leaflet Leaflet Providers, https://github.com/leaflet-extras/leaflet-providers leaflet-measure, https://github.com/ljagis/leaflet-measure Leaflet.Terminator, https://github.com/joergdietrich/Leaflet.Terminator Leaflet.SimpleGraticule, https://github.com/ablakey/Leaflet.SimpleGraticule Leaflet.MagnifyingGlass, https://github.com/bbecquet/Leaflet.MagnifyingGlass Leaflet.MiniMap, https://github.com/Norkart/Leaflet-MiniMap Leaflet.awesome-markers, https://github.com/lvoogdt/Leaflet.awesome-markers Leaflet.EasyButton, https://github.com/CliffCloud/Leaflet.EasyButton/ Proj4Leaflet, https://github.com/kartena/Proj4Leaflet leaflet-locationfilter, https://github.com/kajic/leaflet-locationfilter leaflet-omnivore, https://github.com/mapbox/leaflet-omnivore topojson, https://github.com/topojson/topojson Leaflet.label (https://github.com/Leaflet/Leaflet.labelExtension) L.Label adopted within Leaflet.js L.Tooltip Tooltips now displayed default Leaflet.js styling custom javascript extensions, change *.bindLabel() *.bindTooltip()","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"bug-fixes-and-features-2-0-0","dir":"Changelog","previous_headings":"","what":"Bug fixes and features","title":"leaflet 2.0.0","text":"Relative protocols used possible adding tiles (#526). RStudio 1.1.x Linux Windows, known issue ‘https://’ routes fail load, works within browsers (rstudio/rstudio#2661). Added providers addProviderTiles(): “OpenStreetMap.CH”, “OpenInfraMap”, “OpenInfraMap.Power”, “OpenInfraMap.Telecom”, “OpenInfraMap.Petroleum”, “OpenInfraMap.Water”, “OpenPtMap”, “OpenRailwayMap”, “OpenFireMap”, “SafeCast”. (4aea447) L.multiPolyline absorbed L.polyline, accepts multiple array polyline information. https://web.archive.org/web/20220702182250/https://leafletjs.com/reference-1.3.4.html#polyline. (#515) Fix bug icons anchored top-center, center-center (2a60751) Fix bug markers appear self contained knitr files (cc79bc3) leaflet-label plugin now L.tooltip leaflet.js. labelOptions() now translates old options clickable interactive noHide permanent. Fix bug default addTiles() work .html files served directly filesystem. Add groupOptions function. Currently option letting specify zoom levels group visible. Fix bug accessing columns formulas data source Crosstalk SharedData object wrapping spatial data frame sf object. Fix strange wrapping behavior legend, especially common Chrome browser zoom level 100%. Fix incorrect opacity NA entry legend. (PR #425) Added support drag events (#405) Ensure type safety .indexOf(stamp) (#396) validateCoords() warns invalid polygon data (#393) Added method argument addRasterImage() enable nearest neighbor interpolation projecting categorical rasters (#462) Added 'auto' method addRasterImage(). Projected factor results coerced factors. (9accc7e) Added data parameter remaining addXXX() methods, including addLegend. (f273edd, #491, #485) Added preferCanvas argument leafletOptions() (#521)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-110","dir":"Changelog","previous_headings":"","what":"leaflet 1.1.0","title":"leaflet 1.1.0","text":"CRAN release: 2017-02-21 Add support sf. sf, sfc, sfg classes supported POINT, LINESTRING, MULTILINESTRING, POLYGON, MULTIPOLYGON geometries (note MULTIPOINT currently supported). Added support Crosstalk (https://rstudio.github.io/crosstalk/). Added option highlight polygons, polylines, circles, rectangles hover (use highlightOptions parameter). Fix behavior data contains NA points, zero rows. Previously cause error. Added popupOptions parameter markers shape layers. Upgraded existing plugins respective latest versions added missing/new functionality plugins. (PR #293) Added Proj4Leaflet plugin (PR #294). Added EasyButton plugin (PR #295). Added Graticule plugin (PR #293). Color palette improvements. color palette functions now support viridis palettes (“viridis”, “magma”, “inferno”, “plasma”). Color palette functions now support reversing order colors used, via reverse=TRUE. colorFactor() longer interpolates qualitative RColorBrewer palettes, unless number factor levels mapped exceeds number colors specified RColorBrewer palette. (Issue #300) Upgrade leaflet.js 0.7.7.1 (PR #359) Added way Map instance instantiated via factory.","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-102","dir":"Changelog","previous_headings":"","what":"leaflet 1.0.2","title":"leaflet 1.0.2","text":"used leafletProxy, fitBounds return input object output, magrittr chains break fitBounds called. Add addMeasure()/removeMeasure() functions allow users measure lines areas, via leaflet-measure plugin @ljagis. (PR #171. Thanks, Kenton Russell!) Add input${mapid}_center Shiny event. Add support labels layers, show either statically hover. (PR #181. Thanks Bhaskar Karambelkar!) Add support markers configurable colors icons, via Leaflet.awesome-markers plugin @lvoogdt. See ?addAwesomeMarkers. (PR #184. Great work, Bhaskar!) Add support Leaflet.Terminator plugin @joergdietrich. Overlays day night regions map. See ?addTerminator. (PR #184, thanks Bhaskar!) Add support Leaflet.SimpleGraticule plugin @ablakey. See ?addSimpleGraticule. (PR #184, thanks Bhaskar!) Add support Leaflet.MagnifyingGlass plugin @bbecquet. Adds configurable magnifying glass displays area cursor increased zoom level. See ?addMagnifyingGlass. (PR #184, still Bhaskar!) Add support Leaflet-MiniMap plugin @Norkart. Adds mini map corner can used see change bounds main map. See ?addMiniMap. (PR #184, Bhaskar !) addScaleBar related functions added, showing Leaflet’s built-scale bar one corners map. (PR #201. Thanks Kent Johnson!)","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-101","dir":"Changelog","previous_headings":"","what":"leaflet 1.0.1","title":"leaflet 1.0.1","text":"CRAN release: 2016-02-27 Fix #242: Compatibility htmlwidgets 0.6 (thanks byzheng).","code":""},{"path":"https://rstudio.github.io/leaflet/news/index.html","id":"leaflet-100","dir":"Changelog","previous_headings":"","what":"leaflet 1.0.0","title":"leaflet 1.0.0","text":"CRAN release: 2015-06-24 Initial release","code":""}]