Open
Description
Hi,
I noticed that crosstalk is not able to interact with a leaflet map when marker clustering is enabled. Here is a minimal example, which you can also find illustrated on RPubs (see http://rpubs.com/MatthiasHinz/319619).
library(crosstalk)
library(leaflet)
library(DT)
# Wrap data frame in SharedData
sd <- SharedData$new(quakes[sample(nrow(quakes), 10),])
bscols(
# Create a filter input
filter_slider("mag", "Magnitude", sd, column=~mag, step=0.1, width=250),
leaflet(sd) %>% addTiles() %>% addMarkers( clusterOptions = markerClusterOptions()),
datatable(sd, extensions="Scroller", style="bootstrap", class="compact", width="100%",
options=list(deferRender=TRUE, scrollY=300, scroller=TRUE))
)
Is there any way to make this work together?
Thanks and kind regards
Metadata
Metadata
Assignees
Labels
No labels