Skip to content

Commit 51e1774

Browse files
Merge pull request #261 from tidymodels/tidy-pkgdown
have ?tidy.step_* point to step_*
2 parents 3c105ad + ec1aa90 commit 51e1774

Some content is hidden

Large Commits have some content hidden by default. Use the searchbox below for content that may be hidden.

50 files changed

+81
-160
lines changed

DESCRIPTION

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -62,5 +62,5 @@ Config/testthat/edition: 3
6262
Encoding: UTF-8
6363
LazyData: true
6464
Roxygen: list(markdown = TRUE)
65-
RoxygenNote: 7.2.3
65+
RoxygenNote: 7.3.1
6666
SystemRequirements: "GNU make"

NEWS.md

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,5 +1,7 @@
11
# textrecipes (development version)
22

3+
* Calling `?tidy.step_*()` now sends you to the documentation for `step_*()` where the outcome is documented. (#261)
4+
35
# textrecipes 1.0.6
46

57
* textfeatures has been removed from Suggests. (#255)

R/clean_levels.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -141,8 +141,8 @@ print.step_clean_levels <-
141141
invisible(x)
142142
}
143143

144-
#' @rdname tidy.recipe
145-
#' @param x A `step_clean_levels` object.
144+
#' @rdname step_clean_levels
145+
#' @usage NULL
146146
#' @export
147147
tidy.step_clean_levels <- function(x, ...) {
148148
if (is_trained(x)) {

R/clean_names.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -122,8 +122,8 @@ print.step_clean_names <-
122122
invisible(x)
123123
}
124124

125-
#' @rdname tidy.recipe
126-
#' @param x A `step_clean_names` object.
125+
#' @rdname step_clean_names
126+
#' @usage NULL
127127
#' @export
128128
tidy.step_clean_names <- function(x, ...) {
129129
if (is_trained(x)) {

R/dummy_hash.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -230,8 +230,8 @@ print.step_dummy_hash <-
230230
invisible(x)
231231
}
232232

233-
#' @rdname tidy.recipe
234-
#' @param x A `step_dummy_hash` object.
233+
#' @rdname step_dummy_hash
234+
#' @usage NULL
235235
#' @export
236236
tidy.step_dummy_hash <- function(x, ...) {
237237
if (is_trained(x)) {

R/lda.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -197,8 +197,8 @@ print.step_lda <-
197197
invisible(x)
198198
}
199199

200-
#' @rdname tidy.recipe
201-
#' @param x A `step_lda` object.
200+
#' @rdname step_lda
201+
#' @usage NULL
202202
#' @export
203203
tidy.step_lda <- function(x, ...) {
204204
if (is_trained(x)) {

R/lemma.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -134,8 +134,8 @@ print.step_lemma <-
134134
invisible(x)
135135
}
136136

137-
#' @rdname tidy.recipe
138-
#' @param x A `step_lemma` object.
137+
#' @rdname step_lemma
138+
#' @usage NULL
139139
#' @export
140140
tidy.step_lemma <- function(x, ...) {
141141
if (is_trained(x)) {

R/ngram.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -156,8 +156,8 @@ print.step_ngram <-
156156
invisible(x)
157157
}
158158

159-
#' @rdname tidy.recipe
160-
#' @param x A `step_ngram` object.
159+
#' @rdname step_ngram
160+
#' @usage NULL
161161
#' @export
162162
tidy.step_ngram <- function(x, ...) {
163163
if (is_trained(x)) {

R/pos_filter.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -139,8 +139,8 @@ print.step_pos_filter <-
139139
invisible(x)
140140
}
141141

142-
#' @rdname tidy.recipe
143-
#' @param x A `step_pos_filter` object.
142+
#' @rdname step_pos_filter
143+
#' @usage NULL
144144
#' @export
145145
tidy.step_pos_filter <- function(x, ...) {
146146
if (is_trained(x)) {

R/sequence_onehot.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -200,8 +200,8 @@ print.step_sequence_onehot <-
200200
invisible(x)
201201
}
202202

203-
#' @rdname tidy.recipe
204-
#' @param x A `step_sequence_onehot` object.
203+
#' @rdname step_sequence_onehot
204+
#' @usage NULL
205205
#' @export
206206
tidy.step_sequence_onehot <- function(x, ...) {
207207
if (is_trained(x)) {

0 commit comments

Comments
 (0)