Skip to content

Commit 11efc61

Browse files
ndjrtEmilHvitfeldt
andauthored
Update seealso tag references to refer to related packages and remove recipe package references (#265)
Co-authored-by: Russ Thomas <your email> Co-authored-by: Emil Hvitfeldt <[email protected]>
1 parent 7738ede commit 11efc61

27 files changed

+66
-28
lines changed

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -61,4 +61,4 @@ Config/testthat/edition: 3
6161
Config/usethis/last-upkeep: 2025-04-24
6262
Encoding: UTF-8
6363
Roxygen: list(markdown = TRUE)
64-
RoxygenNote: 7.3.2
64+
RoxygenNote: 7.3.3

R/collapse_cart.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -66,6 +66,7 @@
6666
#' ) |>
6767
#' prep()
6868
#' tidy(rec, number = 1)
69+
#' @seealso [step_collapse_stringdist()]
6970
#' @export
7071
step_collapse_cart <-
7172
function(

R/collapse_stringdist.R

Lines changed: 4 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -65,6 +65,7 @@
6565
#' bake(new_data = NULL)
6666
#'
6767
#' tidy(rec, 1)
68+
#' @seealso [step_collapse_cart()]
6869
#' @export
6970
step_collapse_stringdist <-
7071
function(
@@ -185,7 +186,9 @@ collapse_stringdist_impl <- function(x, dist, method, options) {
185186
repeat {
186187
group[selected] <- TRUE
187188
new_selected <- pairs[pairs[, 2] %in% selected, 1]
188-
if (length(new_selected) == 0) break
189+
if (length(new_selected) == 0) {
190+
break
191+
}
189192
pairs <- pairs[!pairs[, 2] %in% selected, , drop = FALSE]
190193
selected <- new_selected
191194
}

R/discretize_cart.R

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -86,8 +86,7 @@
8686
#' tidy(cart_rec, id = "cart splits")
8787
#'
8888
#' bake(cart_rec, ad_data_te, tau)
89-
#' @seealso [embed::step_discretize_xgb()], [recipes::recipe()],
90-
#' [recipes::prep()], [recipes::bake()]
89+
#' @seealso [recipes::step_discretize()], [step_discretize_xgb()]
9190
#' @export
9291
step_discretize_cart <-
9392
function(

R/discretize_xgb.R

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -99,8 +99,7 @@
9999
#' xgb_rec <- prep(xgb_rec, training = credit_data_tr)
100100
#'
101101
#' bake(xgb_rec, credit_data_te, Assets)
102-
#' @seealso [embed::step_discretize_cart()], [recipes::recipe()],
103-
#' [recipes::prep()], [recipes::bake()]
102+
#' @seealso [recipes::step_discretize()], [step_discretize_cart()]
104103
#' @export
105104
step_discretize_xgb <-
106105
function(

R/lencode.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -104,6 +104,7 @@
104104
#' bake(reencoded, grants_other)
105105
#'
106106
#' tidy(reencoded, 1)
107+
#' @seealso [step_lencode_bayes()], [step_lencode_glm()], [step_lencode_mixed()]
107108
#' @export
108109
step_lencode <-
109110
function(

R/lencode_bayes.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -104,6 +104,7 @@
104104
#' reencoded <- recipe(class ~ sponsor_code, data = grants_other) |>
105105
#' step_lencode_bayes(sponsor_code, outcome = vars(class))
106106
#' }
107+
#' @seealso [step_lencode()], [step_lencode_glm()], [step_lencode_mixed()]
107108
#' @export
108109
step_lencode_bayes <-
109110
function(

R/lencode_glm.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -78,6 +78,7 @@
7878
#' reencoded <- recipe(class ~ sponsor_code, data = grants_other) |>
7979
#' step_lencode_glm(sponsor_code, outcome = vars(class))
8080
#' }
81+
#' @seealso [step_lencode()], [step_lencode_bayes()], [step_lencode_mixed()]
8182
#' @export
8283
step_lencode_glm <-
8384
function(

R/lencode_mixed.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -91,6 +91,7 @@
9191
#' reencoded <- recipe(class ~ sponsor_code, data = grants_other) |>
9292
#' step_lencode_mixed(sponsor_code, outcome = vars(class))
9393
#' }
94+
#' @seealso [step_lencode()], [step_lencode_bayes()], [step_lencode_glm()]
9495
#' @export
9596
step_lencode_mixed <-
9697
function(

R/pca_sparse.R

Lines changed: 3 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -64,7 +64,9 @@
6464
#'
6565
#' @template case-weights-not-supported
6666
#'
67-
#' @seealso [step_pca_sparse_bayes()]
67+
#' @seealso [recipes::step_pca()], [recipes::step_kpca()],
68+
#' [recipes::step_kpca_poly()], [recipes::step_kpca_rbf()],
69+
#' [step_pca_sparse_bayes()], [step_pca_truncated()]
6870
#' @examplesIf rlang::is_installed(c("modeldata", "ggplot2"))
6971
#' library(recipes)
7072
#' library(ggplot2)

0 commit comments

Comments
 (0)