From 7374250b2590b00d121619c11a9589424049753a Mon Sep 17 00:00:00 2001 From: Mark Baillie Date: Sun, 29 May 2022 22:22:46 +0200 Subject: [PATCH 01/10] WIP: remove export for all summarize functions --- R/utils_table.R | 12 +----------- 1 file changed, 1 insertion(+), 11 deletions(-) diff --git a/R/utils_table.R b/R/utils_table.R index 0db6da10..302ebcfc 100644 --- a/R/utils_table.R +++ b/R/utils_table.R @@ -4,7 +4,6 @@ #' #' @param x an object #' @return A summarized version of the input. -#' @export summarize_long <- function(x) UseMethod("summarize_long") @@ -12,7 +11,6 @@ summarize_long <- function(x) UseMethod("summarize_long") #' #' @param x an object of class "factor" #' @return Long list of summary statistics for the input factors. -#' @export summarize_long.factor <- function(x){ x1 <- forcats::fct_explicit_na(x, na_level = "Missing") @@ -29,7 +27,6 @@ summarize_long.factor <- function(x){ #' #' @param x an object of class "integer" #' @return Long list of summary statistics for the input. -#' @export summarize_long.integer <- function(x){ summarize_long.numeric(x) } @@ -38,7 +35,6 @@ summarize_long.integer <- function(x){ #' #' @param x an object of class "numeric" #' @return Long list of summary statistics for the input. -#' @export summarize_long.numeric <- function(x){ dat <- list( mean = mean(x, na.rm = TRUE), @@ -56,7 +52,6 @@ summarize_long.numeric <- function(x){ #' #' @param x an object of any other class #' @return List of counts for unique and missing values in `x`. -#' @export summarize_long.default <- function(x){ dat <- list( unique_values = length(unique(x)), @@ -71,7 +66,6 @@ summarize_long.default <- function(x){ #' #' @param x a vector to be summarized #' @return A summarized less detailed version of the input. -#' @export summarize_short <- function(x) UseMethod("summarize_short") #' Create variable summary for factors @@ -80,7 +74,6 @@ summarize_short <- function(x) UseMethod("summarize_short") #' #' @param x an object of class "factor" #' @return Short list of summary statistics for the input factors. -#' @export summarize_short.factor <- function(x){ x1 <- forcats::fct_explicit_na(x, na_level = "Missing") @@ -101,7 +94,6 @@ summarize_short.factor <- function(x){ #' #' @param x an object of class "numeric" #' @return Short list of summary statistics for the input. -#' @export summarize_short.numeric <- function(x){ dat <- list( `Mean (SD)` = paste0(format(mean(x, na.rm = TRUE), digits = 3), " (", format(sd(x, na.rm = TRUE), digits = 3), ")"), @@ -121,7 +113,6 @@ summarize_short.numeric <- function(x){ #' #' @param x an object of class "integer" #' @return Short list of summary statistics for the input. -#' @export summarize_short.integer <- function(x){ summarize_short.numeric(x) } @@ -130,11 +121,10 @@ summarize_short.integer <- function(x){ #' #' @param x an object of any other class #' @return List of counts for unique and missing values in `x`. -#' @export summarize_short.default <- function(x){ dat <- list( `Unique values` = format(length(unique(x))), `Missing (%)` = paste0(format(sum(is.na(x))), " (", format(100 * sum(is.na(x))/length(x), trim=TRUE), "%)") ) list(dat) -} \ No newline at end of file +} From 595acd28a20ed7553e8d79f50d847573cc8ed9af Mon Sep 17 00:00:00 2001 From: Mark Baillie Date: Sun, 29 May 2022 22:26:09 +0200 Subject: [PATCH 02/10] WIP: remove export for align_plots function --- R/utils_visr.R | 3 --- 1 file changed, 3 deletions(-) diff --git a/R/utils_visr.R b/R/utils_visr.R index 4e85da35..5cf6b4f9 100644 --- a/R/utils_visr.R +++ b/R/utils_visr.R @@ -28,9 +28,6 @@ #' align = "none", #' nrow=2) #' } -#' @export - - align_plots <- function(pltlist) { if (missing(pltlist) | is.null(pltlist)) { From 99dbc5204ab55b8cdd9ee01186a74f5755671e12 Mon Sep 17 00:00:00 2001 From: Mark Baillie Date: Sun, 29 May 2022 22:27:34 +0200 Subject: [PATCH 03/10] WIP: remove export from get_tableone function --- R/get_tableone.R | 6 ++---- 1 file changed, 2 insertions(+), 4 deletions(-) diff --git a/R/get_tableone.R b/R/get_tableone.R index c5b1d97f..6cc3c59a 100644 --- a/R/get_tableone.R +++ b/R/get_tableone.R @@ -18,7 +18,7 @@ #' #' @note All columns in the table will be summarized. If only some columns shall be used, please select only those #' variables prior to creating the summary table by using dplyr::select() - +#' #' @examples #' #' # Example using the ovarian data set @@ -68,8 +68,6 @@ #' #' @rdname get_tableone #' -#' @export - get_tableone <- function(data, strata = NULL, overall=TRUE, summary_function = summarize_short){ UseMethod("get_tableone") } @@ -78,7 +76,7 @@ get_tableone <- function(data, strata = NULL, overall=TRUE, summary_function = s #' @method get_tableone default #' @return object of class tableone. That is a list of data specified summaries #' for all input variables. -#' @export +#' get_tableone.default <- function(data, strata = NULL, overall=TRUE, summary_function = summarize_short){ summary_FUN <- match.fun(summary_function) From a37e6566fac3cd98ef3fbe1182af1890e4428043 Mon Sep 17 00:00:00 2001 From: Mark Baillie Date: Sun, 29 May 2022 22:29:05 +0200 Subject: [PATCH 04/10] WIP: remove export from get_summary function --- R/get_summary.R | 7 ++----- 1 file changed, 2 insertions(+), 5 deletions(-) diff --git a/R/get_summary.R b/R/get_summary.R index c5a16a89..c8d084b7 100644 --- a/R/get_summary.R +++ b/R/get_summary.R @@ -11,13 +11,11 @@ #' #' @rdname get_summary #' -#' @export - get_summary <- function(x, ...){ UseMethod("get_summary", x) } -#' @examples +#' @examples #' #' survfit_object <- survival::survfit(data = adtte, survival::Surv(AVAL, 1-CNSR) ~ TRTP) #' get_summary(survfit_object) @@ -26,8 +24,7 @@ get_summary <- function(x, ...){ #' #' @rdname get_summary #' @method get_summary survfit -#' @export - +#' get_summary.survfit <- function(x, statlist = c("strata", "records", "events", "median", "LCL", "UCL", "CI"), ...) { From 71ed18ab95caa3034982e9de7b7f0fa6344c0279 Mon Sep 17 00:00:00 2001 From: Mark Baillie Date: Sun, 29 May 2022 22:30:12 +0200 Subject: [PATCH 05/10] WIP: remove export from lhs/pipe function --- R/utils_pipe.R | 5 ----- 1 file changed, 5 deletions(-) diff --git a/R/utils_pipe.R b/R/utils_pipe.R index 34787401..4eca7745 100644 --- a/R/utils_pipe.R +++ b/R/utils_pipe.R @@ -1,14 +1,9 @@ #' @title Find the "lhs" in the pipeline -#' #' @description This function finds the left-hand sided symbol in a magrittr pipe and returns it as a character. -#' #' @return Left-hand sided symbol as string in the magrittr pipe. -#' #' @references \url{https://github.com/tidyverse/magrittr/issues/115#issuecomment-173894787} #' -#' @export -#' #' @examples #' blah <- function(x) the_lhs() #' adtte %>% From c45831504f2bd14cc635ebebe0d5bd65c1313533 Mon Sep 17 00:00:00 2001 From: Mark Baillie Date: Sun, 29 May 2022 22:33:01 +0200 Subject: [PATCH 06/10] WIP: remove export for get_risktable and quantilte funcs --- R/get_quantile.R | 44 +++++++++++++++++++++----------------------- R/get_risktable.R | 9 ++------- 2 files changed, 23 insertions(+), 30 deletions(-) diff --git a/R/get_quantile.R b/R/get_quantile.R index db3880a5..31d89f6b 100644 --- a/R/get_quantile.R +++ b/R/get_quantile.R @@ -1,35 +1,33 @@ #' @title Wrapper around quantile methods #' -#' @description S3 method for extracting quantiles. +#' @description S3 method for extracting quantiles. #' No default method is available at the moment. -#' +#' #' @seealso \code{\link[survival]{quantile.survfit}} -#' +#' #' @param x An object of class \code{survfit} #' @param probs probabilities Default = c(0.25,0.50,0.75) #' @inheritParams survival::quantile.survfit #' @param ... other arguments passed on to the method -#' +#' #' @examples -#' +#' #' ## Kaplan-Meier estimates #' survfit_object <- visR::estimate_KM(data = adtte, strata = c("TRTP")) -#' +#' #' ## visR quantiles #' visR::get_quantile(survfit_object) -#' +#' #' ## survival quantiles #' quantile(survfit_object) -#' +#' #' @return A data frame with quantiles of the object -#' +#' #' @rdname get_quantile -#' -#' @export - +#' get_quantile <- function(x, ...){ UseMethod("get_quantile", x) -} +} #' @rdname get_quantile #' @method get_quantile survfit @@ -41,40 +39,40 @@ get_quantile.survfit <- function(x, conf.int = TRUE, tolerance = sqrt(.Machine$double.eps) ) { - + # User input validation --------------------------------------------------- if (conf.int == TRUE & !base::all(c("lower", "upper") %in% names(x))) stop("Confidence limits were not part of original estimation.") - + if (!base::all(is.numeric(probs) == TRUE) | (!base::all(probs < 1))) stop("probs should be a numeric vector.") - + if (!is.numeric(tolerance)) stop("tolerance should be numeric") - + # Extract quantiles ------------------------------------------------------- - + q <- quantile( x ,probs = probs ,conf.int = conf.int ,tolerance = tolerance ,type = 3 ) - + qdf <- do.call(rbind.data.frame, q) - + strata <- as.character(unlist(lapply(q, rownames))) quantity <- unlist(lapply(strsplit(rownames(qdf), "\\.", fixed = FALSE), `[[`, 1)) - + final <- data.frame( cbind(strata, quantity, qdf) ,row.names = NULL ,check.names = FALSE ) - + final <- final[ order( final[, "strata"], final[, "quantity"] ), ] - + return(final) } diff --git a/R/get_risktable.R b/R/get_risktable.R index c28d039e..6ad5a84a 100644 --- a/R/get_risktable.R +++ b/R/get_risktable.R @@ -31,16 +31,13 @@ #' number of patients at risk per strata #' @rdname get_risktable #' -#' @export - get_risktable <- function(x, ...){ UseMethod("get_risktable") } #' @rdname get_risktable #' @method get_risktable survfit -#' @export - +#' get_risktable.survfit <- function( x ,times = NULL @@ -225,7 +222,7 @@ get_risktable.survfit <- function( #' @rdname get_risktable #' @method get_risktable tidycuminc -#' @export +#' get_risktable.tidycuminc <- function(x ,times = pretty(x$tidy$time, 10) ,statlist = "n.risk" @@ -340,5 +337,3 @@ get_risktable.tidycuminc <- function(x return(label[seq_along(statlist)]) } - - From 892c77e22a77259de1f30980783487a1ba655bae Mon Sep 17 00:00:00 2001 From: Mark Baillie Date: Wed, 1 Jun 2022 10:43:41 +0200 Subject: [PATCH 07/10] export * get_summary * align_plots --- R/get_summary.R | 1 + R/utils_visr.R | 3 +++ 2 files changed, 4 insertions(+) diff --git a/R/get_summary.R b/R/get_summary.R index c8d084b7..dccbac6b 100644 --- a/R/get_summary.R +++ b/R/get_summary.R @@ -10,6 +10,7 @@ #' @param ... other arguments passed on to the method #' #' @rdname get_summary +#' @export #' get_summary <- function(x, ...){ UseMethod("get_summary", x) diff --git a/R/utils_visr.R b/R/utils_visr.R index 5cf6b4f9..c059d8fe 100644 --- a/R/utils_visr.R +++ b/R/utils_visr.R @@ -28,6 +28,9 @@ #' align = "none", #' nrow=2) #' } +#' +#' @export +#' align_plots <- function(pltlist) { if (missing(pltlist) | is.null(pltlist)) { From 3ad7833b4452cb72ffeedc88a5b55d1e6e08632f Mon Sep 17 00:00:00 2001 From: Mark Baillie Date: Wed, 1 Jun 2022 10:45:15 +0200 Subject: [PATCH 08/10] package bump --- DESCRIPTION | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/DESCRIPTION b/DESCRIPTION index c0cfc959..ea6a3af7 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Type: Package Package: visR Title: Clinical Graphs and Tables Adhering to Graphical Principles -Version: 0.2.0.9006 +Version: 0.2.0.9007 Authors@R: c( person(given = "Mark", family = "Baillie", From 1466004d96d933ae38d5b94428860c3749408ab4 Mon Sep 17 00:00:00 2001 From: Mark Baillie Date: Wed, 1 Jun 2022 15:30:50 +0200 Subject: [PATCH 09/10] roll back some of the export deletions. trigging test failures and also required for vignettes, examples. * get_* * utils pipe * utilts table --- DESCRIPTION | 2 +- NAMESPACE | 1 - R/get_quantile.R | 2 +- R/get_risktable.R | 5 +++-- R/get_summary.R | 1 + R/get_tableone.R | 3 ++- R/render.R | 7 ------- R/utils_pipe.R | 3 ++- R/utils_table.R | 9 +++++++++ inst/WORDLIST | 4 ++-- man/align_plots.Rd | 1 + man/get_gt.Rd | 6 ------ man/get_summary.Rd | 3 +++ man/render.Rd | 33 --------------------------------- man/render_datatable.Rd | 6 ------ 15 files changed, 25 insertions(+), 61 deletions(-) diff --git a/DESCRIPTION b/DESCRIPTION index 827cac06..7965755f 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Type: Package Package: visR Title: Clinical Graphs and Tables Adhering to Graphical Principles -Version: 0.2.0.9007 +Version: 0.2.0.9008 Authors@R: c( person(given = "Mark", family = "Baillie", diff --git a/NAMESPACE b/NAMESPACE index 422a305a..1161d65d 100644 --- a/NAMESPACE +++ b/NAMESPACE @@ -53,7 +53,6 @@ export(get_summary) export(get_tableone) export(render) export(summarize_long) -export(summarize_short) export(tableone) export(the_lhs) export(tidyme) diff --git a/R/get_quantile.R b/R/get_quantile.R index 31d89f6b..8676ad50 100644 --- a/R/get_quantile.R +++ b/R/get_quantile.R @@ -24,6 +24,7 @@ #' @return A data frame with quantiles of the object #' #' @rdname get_quantile +#' @export #' get_quantile <- function(x, ...){ UseMethod("get_quantile", x) @@ -32,7 +33,6 @@ get_quantile <- function(x, ...){ #' @rdname get_quantile #' @method get_quantile survfit #' @export - get_quantile.survfit <- function(x, ..., probs = c(0.25, 0.50, 0.75), diff --git a/R/get_risktable.R b/R/get_risktable.R index 6ad5a84a..e6211972 100644 --- a/R/get_risktable.R +++ b/R/get_risktable.R @@ -30,6 +30,7 @@ #' @return return list of attributes the form the risk table i.e. #' number of patients at risk per strata #' @rdname get_risktable +#' @export #' get_risktable <- function(x, ...){ UseMethod("get_risktable") @@ -37,7 +38,7 @@ get_risktable <- function(x, ...){ #' @rdname get_risktable #' @method get_risktable survfit -#' +#' @export get_risktable.survfit <- function( x ,times = NULL @@ -222,7 +223,7 @@ get_risktable.survfit <- function( #' @rdname get_risktable #' @method get_risktable tidycuminc -#' +#' @export get_risktable.tidycuminc <- function(x ,times = pretty(x$tidy$time, 10) ,statlist = "n.risk" diff --git a/R/get_summary.R b/R/get_summary.R index dccbac6b..365372c4 100644 --- a/R/get_summary.R +++ b/R/get_summary.R @@ -25,6 +25,7 @@ get_summary <- function(x, ...){ #' #' @rdname get_summary #' @method get_summary survfit +#' @export #' get_summary.survfit <- function(x, statlist = c("strata", "records", "events", "median", "LCL", "UCL", "CI"), diff --git a/R/get_tableone.R b/R/get_tableone.R index 6cc3c59a..f8443027 100644 --- a/R/get_tableone.R +++ b/R/get_tableone.R @@ -67,6 +67,7 @@ #' visR::get_tableone(strata = "TRTA", overall = FALSE) #' #' @rdname get_tableone +#' @export #' get_tableone <- function(data, strata = NULL, overall=TRUE, summary_function = summarize_short){ UseMethod("get_tableone") @@ -76,7 +77,7 @@ get_tableone <- function(data, strata = NULL, overall=TRUE, summary_function = s #' @method get_tableone default #' @return object of class tableone. That is a list of data specified summaries #' for all input variables. -#' +#' @export get_tableone.default <- function(data, strata = NULL, overall=TRUE, summary_function = summarize_short){ summary_FUN <- match.fun(summary_function) diff --git a/R/render.R b/R/render.R index 2cbd11d7..7645614c 100644 --- a/R/render.R +++ b/R/render.R @@ -32,7 +32,6 @@ render <- function(data, #' @inheritParams render -#' @rdname render #' @export #' @method render tableone #' @@ -125,7 +124,6 @@ render.tableone <- function( } #' @inheritParams render -#' @rdname render #' @export #' #' @method render risktable @@ -203,7 +201,6 @@ render.risktable <- function( #' @inheritParams render #' -#' @rdname render #' @method render data.frame #' @export render.data.frame <- function( @@ -325,7 +322,6 @@ render_datatable <- function(data, title, download_format, source_cap){ #' @inheritParams render_datatable #' -#' @rdname render_datatable #' @method render_datatable tableone #' render_datatable.tableone <- function(data, title, download_format, source_cap) { @@ -361,7 +357,6 @@ render_datatable.tableone <- function(data, title, download_format, source_cap) #' @inheritParams render_datatable #' -#' @rdname render_datatable #' @method render_datatable data.frame #' render_datatable.data.frame <- function(data, title, download_format, source_cap) { @@ -436,7 +431,6 @@ get_gt <- function(data, numcols){ #' @inheritParams get_gt #' -#' @rdname get_gt #' @method get_gt tableone #' get_gt.tableone <- function(data, numcols) { @@ -454,7 +448,6 @@ get_gt.tableone <- function(data, numcols) { #' @inheritParams get_gt #' -#' @rdname get_gt #' @method get_gt data.frame #' get_gt.data.frame <- function(data, numcols) { diff --git a/R/utils_pipe.R b/R/utils_pipe.R index 4eca7745..a680da0b 100644 --- a/R/utils_pipe.R +++ b/R/utils_pipe.R @@ -8,7 +8,8 @@ #' blah <- function(x) the_lhs() #' adtte %>% #' blah() - +#' @export +#' the_lhs <- function() { parents <- lapply(sys.frames(), parent.env) diff --git a/R/utils_table.R b/R/utils_table.R index 302ebcfc..9d4433b0 100644 --- a/R/utils_table.R +++ b/R/utils_table.R @@ -4,6 +4,7 @@ #' #' @param x an object #' @return A summarized version of the input. +#' @export summarize_long <- function(x) UseMethod("summarize_long") @@ -11,6 +12,7 @@ summarize_long <- function(x) UseMethod("summarize_long") #' #' @param x an object of class "factor" #' @return Long list of summary statistics for the input factors. +#' @export summarize_long.factor <- function(x){ x1 <- forcats::fct_explicit_na(x, na_level = "Missing") @@ -27,6 +29,7 @@ summarize_long.factor <- function(x){ #' #' @param x an object of class "integer" #' @return Long list of summary statistics for the input. +#' @export summarize_long.integer <- function(x){ summarize_long.numeric(x) } @@ -35,6 +38,7 @@ summarize_long.integer <- function(x){ #' #' @param x an object of class "numeric" #' @return Long list of summary statistics for the input. +#' @export summarize_long.numeric <- function(x){ dat <- list( mean = mean(x, na.rm = TRUE), @@ -52,6 +56,7 @@ summarize_long.numeric <- function(x){ #' #' @param x an object of any other class #' @return List of counts for unique and missing values in `x`. +#' @export summarize_long.default <- function(x){ dat <- list( unique_values = length(unique(x)), @@ -74,6 +79,7 @@ summarize_short <- function(x) UseMethod("summarize_short") #' #' @param x an object of class "factor" #' @return Short list of summary statistics for the input factors. +#' @export summarize_short.factor <- function(x){ x1 <- forcats::fct_explicit_na(x, na_level = "Missing") @@ -94,6 +100,7 @@ summarize_short.factor <- function(x){ #' #' @param x an object of class "numeric" #' @return Short list of summary statistics for the input. +#' @export summarize_short.numeric <- function(x){ dat <- list( `Mean (SD)` = paste0(format(mean(x, na.rm = TRUE), digits = 3), " (", format(sd(x, na.rm = TRUE), digits = 3), ")"), @@ -113,6 +120,7 @@ summarize_short.numeric <- function(x){ #' #' @param x an object of class "integer" #' @return Short list of summary statistics for the input. +#' @export summarize_short.integer <- function(x){ summarize_short.numeric(x) } @@ -121,6 +129,7 @@ summarize_short.integer <- function(x){ #' #' @param x an object of any other class #' @return List of counts for unique and missing values in `x`. +#' @export summarize_short.default <- function(x){ dat <- list( `Unique values` = format(length(unique(x))), diff --git a/inst/WORDLIST b/inst/WORDLIST index 0e9f6ab7..07f76e72 100644 --- a/inst/WORDLIST +++ b/inst/WORDLIST @@ -26,8 +26,6 @@ RGBA RRGGBB RRGGBBAA SDTM -Surv -TRTP Tarone UCL UX @@ -41,10 +39,12 @@ colours conf coxph cran +csv ctype cuminc cumsum datasource +datatable df doi dplyr diff --git a/man/align_plots.Rd b/man/align_plots.Rd index 6ab99e96..296c9431 100644 --- a/man/align_plots.Rd +++ b/man/align_plots.Rd @@ -35,6 +35,7 @@ cowplot::plot_grid(plotlist = visR::align_plots(pltlist = list(p1, p2)), align = "none", nrow=2) } + } \references{ \url{https://stackoverflow.com/questions/26159495} diff --git a/man/get_gt.Rd b/man/get_gt.Rd index 218841b6..1208e5b5 100644 --- a/man/get_gt.Rd +++ b/man/get_gt.Rd @@ -2,15 +2,9 @@ % Please edit documentation in R/render.R \name{get_gt} \alias{get_gt} -\alias{get_gt.tableone} -\alias{get_gt.data.frame} \title{Internal function Get gt object} \usage{ get_gt(data, numcols) - -\method{get_gt}{tableone}(data, numcols) - -\method{get_gt}{data.frame}(data, numcols) } \arguments{ \item{data}{input data set} diff --git a/man/get_summary.Rd b/man/get_summary.Rd index e5c33096..98bf173d 100644 --- a/man/get_summary.Rd +++ b/man/get_summary.Rd @@ -28,7 +28,10 @@ A data frame with summary measures from a \code{survfit} object \description{ S3 method for extracting descriptive statistics across strata. No default method is available at the moment. +} +\examples{ survfit_object <- survival::survfit(data = adtte, survival::Surv(AVAL, 1-CNSR) ~ TRTP) get_summary(survfit_object) + } diff --git a/man/render.Rd b/man/render.Rd index a1c42cfe..9d2e6367 100644 --- a/man/render.Rd +++ b/man/render.Rd @@ -2,9 +2,6 @@ % Please edit documentation in R/render.R \name{render} \alias{render} -\alias{render.tableone} -\alias{render.risktable} -\alias{render.data.frame} \title{Render a data.frame, risktable, or tableone object as a table} \usage{ render( @@ -16,36 +13,6 @@ render( engine = "gt", download_format = c("copy", "csv", "excel") ) - -\method{render}{tableone}( - data, - title, - datasource, - footnote = "", - output_format = "html", - engine = "gt", - download_format = NULL -) - -\method{render}{risktable}( - data, - title, - datasource, - footnote = "", - output_format = "html", - engine = "gt", - download_format = NULL -) - -\method{render}{data.frame}( - data, - title, - datasource, - footnote = "", - output_format = "html", - engine = "gt", - download_format = c("copy", "csv", "excel") -) } \arguments{ \item{data}{Input data.frame or tibble to visualize} diff --git a/man/render_datatable.Rd b/man/render_datatable.Rd index a1f126f0..d4d7fb4c 100644 --- a/man/render_datatable.Rd +++ b/man/render_datatable.Rd @@ -2,15 +2,9 @@ % Please edit documentation in R/render.R \name{render_datatable} \alias{render_datatable} -\alias{render_datatable.tableone} -\alias{render_datatable.data.frame} \title{Experimental internal function to help render a data.frame, risktable or tableone object as a datatable} \usage{ render_datatable(data, title, download_format, source_cap) - -\method{render_datatable}{tableone}(data, title, download_format, source_cap) - -\method{render_datatable}{data.frame}(data, title, download_format, source_cap) } \arguments{ \item{data}{Input data.frame or tibble to visualize} From c0d55ab477154c6b69a7025b1f8a9ddd559f70b7 Mon Sep 17 00:00:00 2001 From: GitHub Actions Date: Wed, 1 Jun 2022 13:35:19 +0000 Subject: [PATCH 10/10] Re-build README.Rmd --- README.md | 2 +- 1 file changed, 1 insertion(+), 1 deletion(-) diff --git a/README.md b/README.md index 1b61c303..92f5c45c 100644 --- a/README.md +++ b/README.md @@ -13,7 +13,7 @@ coverage](https://codecov.io/gh/openpharma/visR/branch/develop/graph/badge.svg)] [![pkgdown](https://github.com/openpharma/visR/actions/workflows/makedocs.yml/badge.svg)](https://github.com/openpharma/visR/actions/workflows/makedocs.yml) [![CRAN status](https://www.r-pkg.org/badges/version/visR)](https://CRAN.R-project.org/package=visR) - + The goal of visR is to enable fit-for-purpose, reusable clinical and