Skip to content

Commit

Permalink
Merge pull request #216 from tidymodels/tidy-pkgdown
Browse files Browse the repository at this point in the history
have ?tidy.step_* point to step_*
  • Loading branch information
EmilHvitfeldt authored Feb 23, 2024
2 parents d42199b + 3fb9824 commit 238a924
Show file tree
Hide file tree
Showing 33 changed files with 46 additions and 110 deletions.
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -57,4 +57,4 @@ Config/Needs/website: tidymodels, ggiraph, tidyverse/tidytemplate, reticulate
Config/testthat/edition: 3
Encoding: UTF-8
Roxygen: list(markdown = TRUE)
RoxygenNote: 7.2.3
RoxygenNote: 7.3.1
2 changes: 2 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
Expand Up @@ -8,6 +8,8 @@

* Fixed regression from 1.1.2 in `step_lencode_glm()` where it couldn't be used on multiple columns.

* Calling `?tidy.step_*()` now sends you to the documentation for `step_*()` where the outcome is documented. (#216)

# embed 1.1.2

## Improvements
Expand Down
4 changes: 2 additions & 2 deletions R/collapse_cart.R
Original file line number Diff line number Diff line change
Expand Up @@ -161,8 +161,8 @@ print.step_collapse_cart <-
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_collapse_cart` object.
#' @rdname step_collapse_cart
#' @usage NULL
#' @export
tidy.step_collapse_cart <- function(x, ...) {
if (is_trained(x)) {
Expand Down
4 changes: 2 additions & 2 deletions R/collapse_stringdist.R
Original file line number Diff line number Diff line change
Expand Up @@ -207,8 +207,8 @@ print.step_collapse_stringdist <-
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_collapse_stringdist` object.
#' @rdname step_collapse_stringdist
#' @usage NULL
#' @export
tidy.step_collapse_stringdist <- function(x, ...) {
if (is_trained(x)) {
Expand Down
4 changes: 2 additions & 2 deletions R/discretize_cart.R
Original file line number Diff line number Diff line change
Expand Up @@ -275,8 +275,8 @@ print.step_discretize_cart <- function(x, width = max(20, options()$width - 30),
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_discretize_cart` object.
#' @rdname step_discretize_cart
#' @usage NULL
#' @export
tidy.step_discretize_cart <- function(x, ...) {
if (is_trained(x)) {
Expand Down
4 changes: 2 additions & 2 deletions R/discretize_xgb.R
Original file line number Diff line number Diff line change
Expand Up @@ -509,8 +509,8 @@ print.step_discretize_xgb <- function(x, width = max(20, options()$width - 30),
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_discretize_xgb` object.
#' @rdname step_discretize_xgb
#' @usage NULL
#' @export
tidy.step_discretize_xgb <- function(x, ...) {
if (is_trained(x)) {
Expand Down
4 changes: 2 additions & 2 deletions R/embed.R
Original file line number Diff line number Diff line change
Expand Up @@ -431,8 +431,8 @@ bake.step_embed <- function(object, new_data, ...) {
new_data
}

#' @rdname tidy.recipe
#' @param x A `step_embed` object.
#' @rdname step_embed
#' @usage NULL
#' @export
tidy.step_embed <- function(x, ...) {
if (is_trained(x)) {
Expand Down
4 changes: 2 additions & 2 deletions R/feature_hash.R
Original file line number Diff line number Diff line change
Expand Up @@ -232,8 +232,8 @@ print.step_feature_hash <-
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_feature_hash` object.
#' @rdname step_feature_hash
#' @usage NULL
#' @export
tidy.step_feature_hash <- function(x, ...) {
if (is_trained(x)) {
Expand Down
6 changes: 3 additions & 3 deletions R/lencode_bayes.R
Original file line number Diff line number Diff line change
Expand Up @@ -267,9 +267,9 @@ print.step_lencode_bayes <-
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_lencode_bayes` object.
#' @export
#' @rdname step_lencode_bayes
#' @usage NULL
#' @export
tidy.step_lencode_bayes <- function(x, ...) {
if (is_trained(x)) {
if (length(x$mapping) == 0) {
Expand Down
4 changes: 2 additions & 2 deletions R/lencode_glm.R
Original file line number Diff line number Diff line change
Expand Up @@ -221,8 +221,8 @@ print.step_lencode_glm <-
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_lencode_glm` object.
#' @rdname step_lencode_glm
#' @usage NULL
#' @export
tidy.step_lencode_glm <- function(x, ...) {
if (is_trained(x)) {
Expand Down
4 changes: 2 additions & 2 deletions R/lencode_mixed.R
Original file line number Diff line number Diff line change
Expand Up @@ -261,8 +261,8 @@ print.step_lencode_mixed <-
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_lencode_mixed` object.
#' @rdname step_lencode_mixed
#' @usage NULL
#' @export
tidy.step_lencode_mixed <- function(x, ...) {
if (is_trained(x)) {
Expand Down
4 changes: 2 additions & 2 deletions R/pca_sparse.R
Original file line number Diff line number Diff line change
Expand Up @@ -243,8 +243,8 @@ pca_coefs <- function(x) {
res
}

#' @rdname tidy.recipe
#' @param x A `step_pca_sparse` object.
#' @rdname step_pca_sparse
#' @usage NULL
#' @export
tidy.step_pca_sparse <- function(x, ...) {
if (!is_trained(x)) {
Expand Down
4 changes: 2 additions & 2 deletions R/pca_sparse_bayes.R
Original file line number Diff line number Diff line change
Expand Up @@ -247,8 +247,8 @@ print.step_pca_sparse_bayes <-
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_pca_sparse_bayes` object.
#' @rdname step_pca_sparse_bayes
#' @usage NULL
#' @export
tidy.step_pca_sparse_bayes <- function(x, ...) {
if (!is_trained(x)) {
Expand Down
6 changes: 2 additions & 4 deletions R/pca_truncated.R
Original file line number Diff line number Diff line change
Expand Up @@ -260,10 +260,8 @@ pca_variances <- function(x) {
res
}

#' @rdname tidy.recipe
#' @param type For `step_pca_truncated`, either `"coef"` (for the variable
#' loadings per component) or `"variance"` (how much variance does each
#' component account for).
#' @rdname step_pca_truncated
#' @usage NULL
#' @export
tidy.step_pca_truncated <- function(x, type = "coef", ...) {
if (!is_trained(x)) {
Expand Down
10 changes: 0 additions & 10 deletions R/tidy.R

This file was deleted.

4 changes: 2 additions & 2 deletions R/umap.R
Original file line number Diff line number Diff line change
Expand Up @@ -315,8 +315,8 @@ print.step_umap <-
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_umap` object.
#' @rdname step_umap
#' @usage NULL
#' @export
tidy.step_umap <- function(x, ...) {
if (is_trained(x)) {
Expand Down
4 changes: 2 additions & 2 deletions R/woe.R
Original file line number Diff line number Diff line change
Expand Up @@ -486,8 +486,8 @@ print.step_woe <- function(x, width = max(20, options()$width - 29), ...) {
invisible(x)
}

#' @rdname tidy.recipe
#' @param x A `step_woe` object.
#' @rdname step_woe
#' @usage NULL
#' @export
tidy.step_woe <- function(x, ...) {
if (is_trained(x)) {
Expand Down
3 changes: 0 additions & 3 deletions _pkgdown.yml
Original file line number Diff line number Diff line change
Expand Up @@ -41,9 +41,6 @@ reference:
- title: miscellaneous
contents:
- dictionary
- title: Tidy Methods
contents:
- tidy.recipe

figures:
fig.width: 8
Expand Down
1 change: 1 addition & 0 deletions man/step_collapse_cart.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_collapse_stringdist.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_discretize_cart.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_discretize_xgb.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_embed.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_feature_hash.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_lencode_bayes.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_lencode_glm.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_lencode_mixed.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_pca_sparse.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_pca_sparse_bayes.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_pca_truncated.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_umap.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

1 change: 1 addition & 0 deletions man/step_woe.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

65 changes: 0 additions & 65 deletions man/tidy.recipe.Rd

This file was deleted.

0 comments on commit 238a924

Please sign in to comment.