shinytitle
- Window Browser Title Change in ShinyThe goal of shinytitle
is to update the browser window title when running a shiny application.
Currently there are three functions:
change_window_title
: Make a single change to the window titleflashing_window_title
: Make the window title flash between the current title and a temporary second title, andbusy_window_title
: Adding the ability to change the browser title to a different string whenever the shiny app is busylibrary(shiny)
library(shinytitle)
ui <- fluidPage(
title = "Initial Title",
use_shiny_title(),
actionButton("button", "Click me for a flashing title"),
actionButton("button2", "Click me for a new title after a 3 second wait")
)
server <- function(input, output, session) {
observeEvent(input$button, {
flashing_window_title(session, "--- Flashing Title ---", duration = 10000)
})
observeEvent(input$button2, {
Sys.sleep(3)
change_window_title(session, "Sleep Finished", inactive_only = TRUE)
})
}
shinyApp(ui, server)