Nothing
#' updateTimerInput
#'
# '(Dynamically) updates the timer widget UI components: step button, reset button, and speed slider.
#'
#' @param session session object
#' @param inputId id of the input object
#' @param step1 modified values for `Step` button, see [shiny::updateActionButton()]
#' @param reset modified values for `Reset` button, see [shiny::updateActionButton()]
#' @param ... modified values for `Speed` slider, see [shiny::updateSliderInput()]
#'
#' @return nothing
#' @importFrom shiny getDefaultReactiveDomain updateSliderInput updateActionButton
#' @export
#'
#' @examples
#' # Example requires the use of a `shiny` app (See Vignette)
#' # Updates the timer UI in a `shiny` app
#' if (interactive()) {
#' library(shiny)
#' library(shinyDTC)
#'
#' ui <- fluidPage(
#' timerUI("timer1"),
#' actionButton("update", "Update Timer UI")
#' )
#'
#' server <- function(input, output, session) {
#' timerServer("timer1")
#'
#' observeEvent(input$update, {
#' updateTimerInput(
#' session, "timer1",
#' step1 = list(label = "Advance"),
#' reset = list(label = "Clear"),
#' min = 0, max = 100, value = 10
#' )
#' })
#' }
#'
#' shinyApp(ui, server)
#' }
updateTimerInput <- function(session=getDefaultReactiveDomain(), inputId, step1=list(), reset=list(), ...) {
args <- list(...)
if (length(args)) {
args$session <- session
args$inputId <- paste0(inputId, "_speed")
do.call("updateSliderInput", args)
}
if (length(step1)) {
step1$session <- session
step1$inputId <- paste0(inputId, "_step")
do.call("updateActionButton", step1)
}
if (length(reset)) {
reset$session <- session
reset$inputId <- paste0(inputId, "_reset")
do.call("updateActionButton", reset)
}
}
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.