inst/examples/shiny/proxy_mapbox/app.R

library(shiny)
library(plotly)

# get all the available mapbox styles
mapStyles <- schema()$layout$layoutAttributes$mapbox$style$values

ui <- fluidPage(
  selectInput("style", "Select a mapbox style", mapStyles),
  plotlyOutput("map")
)

server <- function(input, output, session) {
  
  output$map <- renderPlotly({
    plot_mapbox()
  })
  
  observeEvent(input$style, {
    plotlyProxy("map", session) %>%
      plotlyProxyInvoke(
        "relayout",
        list(mapbox = list(style = input$style))
      )
  })
  
}

shinyApp(ui, server)

Try the plotly package in your browser

Any scripts or data that you put into this service are public.

plotly documentation built on Oct. 22, 2023, 1:14 a.m.