Skip to content

Commit 0157633

Browse files
committed
Missing popupOptions for awesomeMarkers
1 parent 1092c4f commit 0157633

File tree

2 files changed

+10
-5
lines changed

2 files changed

+10
-5
lines changed

R/plugin-awesomeMarkers.R

Lines changed: 4 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -207,6 +207,7 @@ verifyIconLibrary <- function(library) {
207207
#' the latitude column from \code{data})
208208
#' @param popup a character vector of the HTML content for the popups (you are
209209
#' recommended to escape the text using \code{\link[htmltools]{htmlEscape}()}
210+
#' @param popupOptions A Vector of \code{\link{popupOptions}} to provide popups
210211
#' for security reasons)
211212
#' @param layerId the layer id
212213
#' @param group the name of the group the newly created layers should belong to
@@ -233,6 +234,7 @@ addAwesomeMarkers = function(
233234
map, lng = NULL, lat = NULL, layerId = NULL, group = NULL,
234235
icon = NULL,
235236
popup = NULL,
237+
popupOptions = NULL,
236238
label = NULL,
237239
labelOptions = NULL,
238240
options = markerOptions(),
@@ -270,7 +272,8 @@ addAwesomeMarkers = function(
270272

271273
pts = derivePoints(data, lng, lat, missing(lng), missing(lat), "addAwesomeMarkers")
272274
invokeMethod(
273-
map, data, 'addAwesomeMarkers', pts$lat, pts$lng, icon, layerId, group, options, popup,
275+
map, data, 'addAwesomeMarkers', pts$lat, pts$lng, icon, layerId,
276+
group, options, popup, popupOptions,
274277
clusterOptions, clusterId, safeLabel(label, data), labelOptions
275278
) %>% expandLimits(pts$lat, pts$lng)
276279
}

man/addAwesomeMarkers.Rd

Lines changed: 6 additions & 4 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)