Show a toast notification. showToast()
wraps the JavaScript toastr library. To use showToast()
include useShinyFeedback()
at the top of your ui. If you only want to use the toasts you can set the “feedback” argument to FALSE
to only include css and js for the toasts.
library(shiny)
library(shinyFeedback)
<- fluidPage(
ui useShinyFeedback(feedback = FALSE),
fluidRow(
column(
12,
br(),
loadingButton(
"myFirstButton",
label = "Submit"
)
)
)
)
<- function(input, output, session) {
server
# reset the loadingButton to its active state after 2 seconds
observeEvent(input$myFirstButton, {
Sys.sleep(2)
resetLoadingButton("myFirstButton")
showToast(
"success",
"I'll toast to that!"
)
})
}
shinyApp(ui, server)
shinyFeedback is not the first R package to wrap the toastr JavaScript library. The shinytoastr package did this years ago. The main difference between the shinyFeedback::showToast()
implementation and shinytoastr
’s is that we supply a “.options” argument rather than having an argument for each toastr option. This allows you to more easily set global toast options. e.g.
# use this list for all your toasts
<- list(
myToastOptions positionClass = "toast-top-right",
progressBar = FALSE,
timeOut = 3000,
closeButton = TRUE,
# same as defaults
newestOnTop = TRUE,
preventDuplicates = FALSE,
showDuration = 300,
hideDuration = 1000,
extendedTimeOut = 1000,
showEasing = "linear",
hideEasing = "linear",
showMethod = "fadeIn",
hideMethod = "fadeOut"
)
library(shiny)
library(shinyFeedback)
<- fluidPage(
ui useShinyFeedback(feedback = FALSE),
fluidRow(
column(
12,
br(),
loadingButton(
"myLoadingButton",
label = "Submit"
),loadingButton(
"myErrorButton",
label = "Error",
class = "btn btn-danger",
loadingLabel = "Erroring...",
)
)
)
)
<- function(input, output, session) {
server
# reset the loadingButton to its active state after 2 seconds
observeEvent(input$myLoadingButton, {
Sys.sleep(2)
resetLoadingButton("myLoadingButton")
showToast(
"success",
"I'll toast to that!",
.options = myToastOptions
)
})
observeEvent(input$myErrorButton, {
Sys.sleep(2)
resetLoadingButton("myErrorButton")
showToast(
"error",
"Your toast is on fire!",
.options = myToastOptions
)
})
}
shinyApp(ui, server)