From acbd1ed61ddd6f2146c31fd0bdfac0cd9ec54c6d Mon Sep 17 00:00:00 2001 From: Hedley Date: Fri, 28 Oct 2022 14:12:02 +1300 Subject: [PATCH] Show renderDataTable deprecation message by default --- R/shinywrappers.R | 20 ++++++++++---------- tools/documentation/pkgdown.yml | 2 +- 2 files changed, 11 insertions(+), 11 deletions(-) diff --git a/R/shinywrappers.R b/R/shinywrappers.R index 3cac12edd2..82f48b6471 100644 --- a/R/shinywrappers.R +++ b/R/shinywrappers.R @@ -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 @@ -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 @@ -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 for more information" - ) - } + + shinyDeprecated( + "0.11.1", "shiny::renderDataTable()", "DT::renderDT()", + details = "See for more information." + ) + func <- installExprFunction(expr, "func", env, quoted, label = "renderDataTable") diff --git a/tools/documentation/pkgdown.yml b/tools/documentation/pkgdown.yml index 5af6a2e919..65b2b56581 100644 --- a/tools/documentation/pkgdown.yml +++ b/tools/documentation/pkgdown.yml @@ -105,7 +105,6 @@ reference: - renderPlot - renderCachedPlot - renderPrint - - renderDataTable - renderImage - renderTable - renderUI @@ -215,6 +214,7 @@ reference: desc: Functions that have been `r lifecycle::badge("superseded")` contents: - markRenderFunction + - renderDataTable - shinyUI - shinyServer - exprToFunction