R Shiny echarts4r Map Zoom

I'm able to load up successfully R Shiny map using echarts4r library. I'm looking to add a simple zoom for users to zoom in and out.

I have added function to zoom, and it shows up on the Map (in the upper right hand corner), but when I attempt to use, it does not actually do any sort of zoom. Suggestions?

# ui.R
library(shiny)
library(echarts4r)
library(echarts4r.maps)

shinyUI(fluidPage(
      echarts4rOutput("map")
    ))

# server.R
library(shiny)
library(dplyr)
library(echarts4r)
library(echarts4r.maps)

shinyServer(function(input, output) {

output$map <- echarts4r::renderEcharts4r({
  ca <- e_charts() %>%
  em_map("Canada") %>% 
  e_map(map = "Canada") %>%
  e_datazoom()
})
  
})

This topic was automatically closed 54 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.