library(crosstalk)
sd <- SharedData$new(quakes[sample(nrow(quakes), 100),])

library(leaflet)
library(d3scatter)

bscols(widths = c(2, NA, NA),
  filter_slider("stations", "Stations", sd, ~stations),
  leaflet(sd, width = "100%", height = 400) %>% addTiles() %>% addMarkers(),
  d3scatter(sd, width = "100%", height = 400, ~mag, ~depth, ~stations)
)
## Assuming 'long' and 'lat' are longitude and latitude, respectively