-
Notifications
You must be signed in to change notification settings - Fork 505
Open
Description
Labels can't be specified as formulas when the map data is a crosstalk SharedData. Simple example:
library(crosstalk)
library(leaflet)
shared_quakes <- SharedData$new(quakes[sample(nrow(quakes), 100),])
map = leaflet(shared_quakes,) %>% addTiles() %>%
addMarkers(label=~as.character(depth))
gives error
Error in UseMethod("metaData") :
no applicable method for 'metaData' applied to an object of class "c('SharedData', 'R6')"
The problem is a simple mis-spelling at line 2 of normalize-SharedData.R
. metaData.sharedData
should be metaData.SharedData
.
bhaskarvk
Metadata
Metadata
Assignees
Labels
No labels