From 633f1553f96efb808e7d8563e76e13dbf01f267f Mon Sep 17 00:00:00 2001 From: Etienne Bacher <52219252+etiennebacher@users.noreply.github.com> Date: Sat, 18 May 2024 22:02:59 +0100 Subject: [PATCH] lintr, styler --- R/center.R | 46 ++++++++++++++++++------------------- R/convert_na_to.R | 4 ++-- R/data_group.R | 16 ++++++------- R/data_relocate.R | 2 ++ R/data_rename.R | 3 ++- R/data_rescale.R | 12 +++++----- R/select_nse.R | 2 +- man/categorize.Rd | 3 ++- man/data_match.Rd | 3 ++- man/data_merge.Rd | 3 ++- man/data_partition.Rd | 3 ++- man/data_relocate.Rd | 3 ++- man/data_rename.Rd | 3 ++- man/data_rotate.Rd | 3 ++- man/data_to_long.Rd | 3 ++- man/data_to_wide.Rd | 3 ++- man/extract_column_names.Rd | 3 ++- man/recode_values.Rd | 3 ++- man/slide.Rd | 3 ++- man/winsorize.Rd | 3 ++- 20 files changed, 70 insertions(+), 54 deletions(-) diff --git a/R/center.R b/R/center.R index 021e157f7..7e9d09aa4 100644 --- a/R/center.R +++ b/R/center.R @@ -118,21 +118,21 @@ center.numeric <- function(x, center <- TRUE } - args <- .process_std_center(x, weights, robust, verbose, reference, center, scale = NULL) + my_args <- .process_std_center(x, weights, robust, verbose, reference, center, scale = NULL) dot_args <- list(...) - if (is.null(args)) { + if (is.null(my_args)) { # all NA? return(x) - } else if (is.null(args$check)) { - vals <- rep(0, length(args$vals)) # If only unique value + } else if (is.null(my_argscheck)) { + vals <- rep(0, length(my_argsvals)) # If only unique value } else { - vals <- as.vector(args$vals - args$center) + vals <- as.vector(my_argsvals - my_argscenter) } - centered_x <- rep(NA, length(args$valid_x)) - centered_x[args$valid_x] <- vals - attr(centered_x, "center") <- args$center + centered_x <- rep(NA, length(my_argsvalid_x)) + centered_x[my_argsvalid_x] <- vals + attr(centered_x, "center") <- my_argscenter attr(centered_x, "scale") <- 1 attr(centered_x, "robust") <- robust # labels @@ -197,29 +197,29 @@ center.data.frame <- function(x, ) # process arguments - args <- .process_std_args(x, select, exclude, weights, append, + my_args <- .process_std_args(x, select, exclude, weights, append, append_suffix = "_c", keep_factors = force, remove_na, reference, .center = center, .scale = NULL ) # set new values - x <- args$x + x <- my_args$x - for (var in args$select) { + for (var in my_args$select) { x[[var]] <- center( x[[var]], robust = robust, - weights = args$weights, + weights = my_args$weights, verbose = FALSE, reference = reference[[var]], - center = args$center[var], + center = my_args$center[var], force = force, add_transform_class = FALSE ) } - attr(x, "center") <- vapply(x[args$select], function(z) attributes(z)$center, numeric(1)) - attr(x, "scale") <- vapply(x[args$select], function(z) attributes(z)$scale, numeric(1)) + attr(x, "center") <- vapply(x[my_args$select], function(z) attributes(z)$center, numeric(1)) + attr(x, "scale") <- vapply(x[my_args$select], function(z) attributes(z)$scale, numeric(1)) attr(x, "robust") <- robust x } @@ -249,19 +249,19 @@ center.grouped_df <- function(x, verbose = verbose ) - args <- .process_grouped_df( + my_args <- .process_grouped_df( x, select, exclude, append, append_suffix = "_c", reference, weights, keep_factors = force ) - for (rows in args$grps) { - args$x[rows, ] <- center( - args$x[rows, , drop = FALSE], - select = args$select, + for (rows in my_args$grps) { + my_args$x[rows, ] <- center( + my_args$x[rows, , drop = FALSE], + select = my_args$select, exclude = NULL, robust = robust, - weights = args$weights, + weights = my_args$weights, remove_na = remove_na, verbose = verbose, force = force, @@ -272,8 +272,8 @@ center.grouped_df <- function(x, ) } # set back class, so data frame still works with dplyr - attributes(args$x) <- args$info - args$x + attributes(my_args$x) <- my_args$info + my_args$x } diff --git a/R/convert_na_to.R b/R/convert_na_to.R index 5454d0c6f..6b50f6bc8 100644 --- a/R/convert_na_to.R +++ b/R/convert_na_to.R @@ -160,10 +160,10 @@ convert_na_to.data.frame <- function(x, regex = FALSE, verbose = TRUE, ...) { - data <- x + my_data <- x select_nse <- .select_nse( select, - data, + data = my_data, exclude = exclude, ignore_case, regex = regex, diff --git a/R/data_group.R b/R/data_group.R index e1ab00758..00a7adf84 100644 --- a/R/data_group.R +++ b/R/data_group.R @@ -41,26 +41,26 @@ data_group <- function(data, verbose = verbose ) # create grid with combinations of all levels - grid <- as.data.frame(expand.grid(lapply(data[select], unique))) + my_grid <- as.data.frame(expand.grid(lapply(data[select], unique))) # sort grid - grid <- grid[do.call(order, grid), , drop = FALSE] + my_grid <- my_grid[do.call(order, my_grid), , drop = FALSE] - .rows <- lapply(seq_len(nrow(grid)), function(i) { + .rows <- lapply(seq_len(nrow(my_grid)), function(i) { as.integer(data_match( data, - to = grid[i, , drop = FALSE], + to = my_grid[i, , drop = FALSE], match = "and", return_indices = TRUE, drop_na = FALSE )) }) - grid[[".rows"]] <- .rows + my_grid[[".rows"]] <- .rows # remove data_match attributes - attr(grid, "out.attrs") <- NULL - attr(grid, ".drop") <- TRUE + attr(my_grid, "out.attrs") <- NULL + attr(my_grid, ".drop") <- TRUE - attr(data, "groups") <- grid + attr(data, "groups") <- my_grid class(data) <- unique(c("grouped_df", "data.frame"), class(data)) data diff --git a/R/data_relocate.R b/R/data_relocate.R index 58cc0265e..00bf3f38a 100644 --- a/R/data_relocate.R +++ b/R/data_relocate.R @@ -97,6 +97,7 @@ data_relocate <- function(data, original_after <- after # Find new positions + # nolint start if (!is.null(before)) { before <- before[before %in% data_cols][1] # Take first that exists (if vector is supplied) if (length(before) != 1 || is.na(before)) { @@ -123,6 +124,7 @@ data_relocate <- function(data, where <- 1 position <- union(position, where) } + # nolint end # Set left and right side lhs <- setdiff(seq(1, where - 1), position) diff --git a/R/data_rename.R b/R/data_rename.R index 2ef72e9e7..b8f213c7f 100644 --- a/R/data_rename.R +++ b/R/data_rename.R @@ -43,7 +43,8 @@ #' - Functions to rename stuff: [data_rename()], [data_rename_rows()], [data_addprefix()], [data_addsuffix()] #' - Functions to reorder or remove columns: [data_reorder()], [data_relocate()], [data_remove()] #' - Functions to reshape, pivot or rotate data frames: [data_to_long()], [data_to_wide()], [data_rotate()] -#' - Functions to recode data: [rescale()], [reverse()], [categorize()], [recode_values()], [slide()] +#' - Functions to recode data: [rescale()], [reverse()], [categorize()], +#' [recode_values()], [slide()] #' - Functions to standardize, normalize, rank-transform: [center()], [standardize()], [normalize()], [ranktransform()], [winsorize()] #' - Split and merge data frames: [data_partition()], [data_merge()] #' - Functions to find or select columns: [data_select()], [extract_column_names()] diff --git a/R/data_rescale.R b/R/data_rescale.R index 90c84a49e..aaa5b1181 100644 --- a/R/data_rescale.R +++ b/R/data_rescale.R @@ -202,7 +202,7 @@ rescale.grouped_df <- function(x, # create the new variables and updates "select", so new variables are processed if (!isFALSE(append)) { # process arguments - args <- .process_append( + my_args <- .process_append( x, select, append, @@ -210,8 +210,8 @@ rescale.grouped_df <- function(x, preserve_value_labels = TRUE ) # update processed arguments - x <- args$x - select <- args$select + x <- my_args$x + select <- my_args$select } x <- as.data.frame(x) @@ -263,15 +263,15 @@ rescale.data.frame <- function(x, # create the new variables and updates "select", so new variables are processed if (!isFALSE(append)) { # process arguments - args <- .process_append( + my_args <- .process_append( x, select, append, append_suffix = "_r" ) # update processed arguments - x <- args$x - select <- args$select + x <- my_args$x + select <- my_args$select } # Transform the range so that it is a list now diff --git a/R/select_nse.R b/R/select_nse.R index 299f22101..eb1c6012a 100644 --- a/R/select_nse.R +++ b/R/select_nse.R @@ -149,7 +149,7 @@ # 3 types of symbols: # - unquoted variables # - objects that need to be evaluated, e.g data_find(iris, i) where -# i is a function arg or is defined before. This can also be a +# i is a function arg or is defined before. This can also be a # vector of names or positions. # - functions (without parenthesis) diff --git a/man/categorize.Rd b/man/categorize.Rd index c3401216e..28f823dd4 100644 --- a/man/categorize.Rd +++ b/man/categorize.Rd @@ -223,7 +223,8 @@ categorize(x, "equal_length", n_groups = 3, labels = "median") \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/data_match.Rd b/man/data_match.Rd index b900d788b..a57c34768 100644 --- a/man/data_match.Rd +++ b/man/data_match.Rd @@ -121,7 +121,8 @@ data_filter(mtcars, fl) \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/data_merge.Rd b/man/data_merge.Rd index 176dfea80..089949c3e 100644 --- a/man/data_merge.Rd +++ b/man/data_merge.Rd @@ -184,7 +184,8 @@ data_merge(list(x, y, z), join = "bind", by = "id", id = "source") \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/data_partition.Rd b/man/data_partition.Rd index f68e5d141..68ac05a19 100644 --- a/man/data_partition.Rd +++ b/man/data_partition.Rd @@ -74,7 +74,8 @@ lapply(out, function(i) table(i$Species)) \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/data_relocate.Rd b/man/data_relocate.Rd index 86c7464ee..30e4dbbfe 100644 --- a/man/data_relocate.Rd +++ b/man/data_relocate.Rd @@ -135,7 +135,8 @@ head(data_remove(iris, starts_with("Sepal"))) \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/data_rename.Rd b/man/data_rename.Rd index 4c3cff00f..f1f4de938 100644 --- a/man/data_rename.Rd +++ b/man/data_rename.Rd @@ -146,7 +146,8 @@ head(data_rename(iris, replacement = paste0("Var", 1:5))) \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/data_rotate.Rd b/man/data_rotate.Rd index 973b0c7ae..604f4f603 100644 --- a/man/data_rotate.Rd +++ b/man/data_rotate.Rd @@ -55,7 +55,8 @@ data_rotate(x, colnames = "c") \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/data_to_long.Rd b/man/data_to_long.Rd index ab3783584..ea478c545 100644 --- a/man/data_to_long.Rd +++ b/man/data_to_long.Rd @@ -162,7 +162,8 @@ data_to_long( \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/data_to_wide.Rd b/man/data_to_wide.Rd index e04d4ac85..e0f36b7e6 100644 --- a/man/data_to_wide.Rd +++ b/man/data_to_wide.Rd @@ -127,7 +127,8 @@ data_to_wide( \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/extract_column_names.Rd b/man/extract_column_names.Rd index d19beaa7a..b8c646789 100644 --- a/man/extract_column_names.Rd +++ b/man/extract_column_names.Rd @@ -188,7 +188,8 @@ extract_column_names(iris, numeric_mean_35) \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/recode_values.Rd b/man/recode_values.Rd index e4384593c..9810c0a2d 100644 --- a/man/recode_values.Rd +++ b/man/recode_values.Rd @@ -294,7 +294,8 @@ options(data_recode_pattern = NULL) \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/slide.Rd b/man/slide.Rd index 986b4b2fb..ccc6bd7e9 100644 --- a/man/slide.Rd +++ b/man/slide.Rd @@ -124,7 +124,8 @@ sapply(mtcars, min) \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}} diff --git a/man/winsorize.Rd b/man/winsorize.Rd index ceeccd8ba..3971a1ae7 100644 --- a/man/winsorize.Rd +++ b/man/winsorize.Rd @@ -85,7 +85,8 @@ winsorize(iris, threshold = 0.2) \item Functions to rename stuff: \code{\link[=data_rename]{data_rename()}}, \code{\link[=data_rename_rows]{data_rename_rows()}}, \code{\link[=data_addprefix]{data_addprefix()}}, \code{\link[=data_addsuffix]{data_addsuffix()}} \item Functions to reorder or remove columns: \code{\link[=data_reorder]{data_reorder()}}, \code{\link[=data_relocate]{data_relocate()}}, \code{\link[=data_remove]{data_remove()}} \item Functions to reshape, pivot or rotate data frames: \code{\link[=data_to_long]{data_to_long()}}, \code{\link[=data_to_wide]{data_to_wide()}}, \code{\link[=data_rotate]{data_rotate()}} -\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, \code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} +\item Functions to recode data: \code{\link[=rescale]{rescale()}}, \code{\link[=reverse]{reverse()}}, \code{\link[=categorize]{categorize()}}, +\code{\link[=recode_values]{recode_values()}}, \code{\link[=slide]{slide()}} \item Functions to standardize, normalize, rank-transform: \code{\link[=center]{center()}}, \code{\link[=standardize]{standardize()}}, \code{\link[=normalize]{normalize()}}, \code{\link[=ranktransform]{ranktransform()}}, \code{\link[=winsorize]{winsorize()}} \item Split and merge data frames: \code{\link[=data_partition]{data_partition()}}, \code{\link[=data_merge]{data_merge()}} \item Functions to find or select columns: \code{\link[=data_select]{data_select()}}, \code{\link[=extract_column_names]{extract_column_names()}}