Saving Over/Reusing Server Bookmark URL

Hello, I would like to be able to save over a bookmark link when clicking the bookmark button from a restored session. Has anyone pulled this off?

Ideally, the process would work as follows...

  1. User starts brand new session
  2. User clicks 'Bookmark'
  3. 'On server' URL is generated (e.g. http://someip:port/?state_id=a1b2c3d4)
  4. User later accesses app with 'on-server' URL (http://someip:port/?state_id=a1b2c3d4)
  5. User clicks bookmark
  6. http://someip:port/?state_id=a1b2c3d4 is overwritten with new state
library(shiny)

# Define UI for application that draws a histogram
ui <- function(request){fluidPage(

    # Application title
    titlePanel("Old Faithful Geyser Data"),
    bookmarkButton(),
    br(),
    br(),

    # Sidebar with a slider input for number of bins 
    sidebarLayout(
        sidebarPanel(
            sliderInput("bins",
                        "Number of bins:",
                        min = 1,
                        max = 50,
                        value = 30)
        ),

        # Show a plot of the generated distribution
        mainPanel(
           plotOutput("distPlot")
        )
    )
)}

# Define server logic required to draw a histogram
server <- function(input, output) {

    output$distPlot <- renderPlot({
        # generate bins based on input$bins from ui.R
        x    <- faithful[, 2]
        bins <- seq(min(x), max(x), length.out = input$bins + 1)

        # draw the histogram with the specified number of bins
        hist(x, breaks = bins, col = 'darkgray', border = 'white')
    })
}

# Run the application 
shinyApp(ui = ui, server = server,enableBookmarking = "server")

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.