Nothing
library(shiny)
library(plotly)
ui <- fluidPage(
plotlyOutput("p"),
textOutput("time1"),
textOutput("time2")
)
server <- function(input, output, session) {
output$p <- renderPlotly({
plot_ly(x = 1, y = 1, marker = list(size = 100)) %>%
add_trace(text = "Click me", mode = "markers+text")
})
output$time1 <- renderText({
event_data("plotly_click")
paste("Input priority: ", Sys.time())
})
output$time2 <- renderText({
event_data("plotly_click", priority = "event")
paste("Event priority: ", Sys.time())
})
}
shinyApp(ui, server)
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.