Skip to content

Commit

Permalink
Show renderDataTable deprecation message by default
Browse files Browse the repository at this point in the history
  • Loading branch information
hedsnz committed Oct 28, 2022
1 parent e48e9c6 commit de8153c
Show file tree
Hide file tree
Showing 2 changed files with 11 additions and 11 deletions.
20 changes: 10 additions & 10 deletions R/shinywrappers.R
Original file line number Diff line number Diff line change
Expand Up @@ -778,8 +778,8 @@ renderUI <- function(expr, env = parent.frame(), quoted = FALSE,
#' function.)
#' @param contentType A string of the download's
#' [content type](https://en.wikipedia.org/wiki/Internet_media_type), for
#' example `"text/csv"` or `"image/png"`. If `NULL`, the content type
#' will be guessed based on the filename extension, or
#' example `"text/csv"` or `"image/png"`. If `NULL`, the content type
#' will be guessed based on the filename extension, or
#' `application/octet-stream` if the extension is unknown.
#' @param outputArgs A list of arguments to be passed through to the implicit
#' call to [downloadButton()] when `downloadHandler` is used
Expand Down Expand Up @@ -822,8 +822,8 @@ downloadHandler <- function(filename, content, contentType=NULL, outputArgs=list
#' Table output with the JavaScript DataTables library
#'
#' @description
#' `r lifecycle::badge("superseded")` Please use
#' \href{https://rstudio.github.io/DT/shiny.html}{\code{DT::renderDataTable()}}.
#' `r lifecycle::badge("deprecated")` Please use
#' \href{https://rstudio.github.io/DT/shiny.html}{\code{DT::renderDT()}}.
#' (Shiny 0.11.1)
#'
#' Makes a reactive version of the given function that returns a data frame (or
Expand Down Expand Up @@ -893,12 +893,12 @@ renderDataTable <- function(expr, options = NULL, searchDelay = 500,
outputArgs=list())
{

if (in_devmode()) {
shinyDeprecated(
"0.11.1", "shiny::renderDataTable()", "DT::renderDataTable()",
details = "See <https://rstudio.github.io/DT/shiny.html> for more information"
)
}

shinyDeprecated(
"0.11.1", "shiny::renderDataTable()", "DT::renderDT()",
details = "See <https://rstudio.github.io/DT/shiny.html> for more information."
)


func <- installExprFunction(expr, "func", env, quoted, label = "renderDataTable")

Expand Down
2 changes: 1 addition & 1 deletion tools/documentation/pkgdown.yml
Original file line number Diff line number Diff line change
Expand Up @@ -105,7 +105,6 @@ reference:
- renderPlot
- renderCachedPlot
- renderPrint
- renderDataTable
- renderImage
- renderTable
- renderUI
Expand Down Expand Up @@ -215,6 +214,7 @@ reference:
desc: Functions that have been `r lifecycle::badge("superseded")`
contents:
- markRenderFunction
- renderDataTable
- shinyUI
- shinyServer
- exprToFunction

0 comments on commit de8153c

Please sign in to comment.