Skip to content

Commit

Permalink
docs(downloadHandler): Link to outputOptions()
Browse files Browse the repository at this point in the history
  • Loading branch information
gadenbuie committed Feb 28, 2025
1 parent 9fbb2c5 commit e6f83f1
Show file tree
Hide file tree
Showing 2 changed files with 17 additions and 0 deletions.
7 changes: 7 additions & 0 deletions R/shinywrappers.R
Original file line number Diff line number Diff line change
Expand Up @@ -809,6 +809,13 @@ renderUI <- function(expr, env = parent.frame(), quoted = FALSE,
#'
#' shinyApp(ui, server)
#' }
#'
#' @seealso
#' * The download handler, like other outputs, is suspended (disabled) by
#' default for download buttons and links that are hidden. Use
#' [outputOptions()] to control this behavior, e.g. to set
#' `suspendWhenHidden = FALSE` if the download is initiated by
#' programmatically clicking on the download button using JavaScript.
#' @export
downloadHandler <- function(filename, content, contentType=NULL, outputArgs=list()) {
renderFunc <- function(shinysession, name, ...) {
Expand Down
10 changes: 10 additions & 0 deletions man/downloadHandler.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit e6f83f1

Please sign in to comment.