Skip to content

Commit 95873aa

Browse files
committed
merge main
Merge commit '51e17745f2383f663bc4ff9b6bdba1553af888d2' #Conflicts: # NEWS.md
2 parents f22688b + 51e1774 commit 95873aa

Some content is hidden

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

49 files changed

+80
-159
lines changed

NEWS.md

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -2,6 +2,8 @@
22

33
* Documentation for tidy methods for all steps has been improved to describe the return value more accurately. (#262)
44

5+
* Calling `?tidy.step_*()` now sends you to the documentation for `step_*()` where the outcome is documented. (#261)
6+
57
# textrecipes 1.0.6
68

79
* 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
@@ -147,8 +147,8 @@ print.step_clean_levels <-
147147
invisible(x)
148148
}
149149

150-
#' @rdname tidy.recipe
151-
#' @param x A `step_clean_levels` object.
150+
#' @rdname step_clean_levels
151+
#' @usage NULL
152152
#' @export
153153
tidy.step_clean_levels <- function(x, ...) {
154154
if (is_trained(x)) {

R/clean_names.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -128,8 +128,8 @@ print.step_clean_names <-
128128
invisible(x)
129129
}
130130

131-
#' @rdname tidy.recipe
132-
#' @param x A `step_clean_names` object.
131+
#' @rdname step_clean_names
132+
#' @usage NULL
133133
#' @export
134134
tidy.step_clean_names <- function(x, ...) {
135135
if (is_trained(x)) {

R/dummy_hash.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -236,8 +236,8 @@ print.step_dummy_hash <-
236236
invisible(x)
237237
}
238238

239-
#' @rdname tidy.recipe
240-
#' @param x A `step_dummy_hash` object.
239+
#' @rdname step_dummy_hash
240+
#' @usage NULL
241241
#' @export
242242
tidy.step_dummy_hash <- function(x, ...) {
243243
if (is_trained(x)) {

R/lda.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -203,8 +203,8 @@ print.step_lda <-
203203
invisible(x)
204204
}
205205

206-
#' @rdname tidy.recipe
207-
#' @param x A `step_lda` object.
206+
#' @rdname step_lda
207+
#' @usage NULL
208208
#' @export
209209
tidy.step_lda <- function(x, ...) {
210210
if (is_trained(x)) {

R/lemma.R

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

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

R/ngram.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -161,8 +161,8 @@ print.step_ngram <-
161161
invisible(x)
162162
}
163163

164-
#' @rdname tidy.recipe
165-
#' @param x A `step_ngram` object.
164+
#' @rdname step_ngram
165+
#' @usage NULL
166166
#' @export
167167
tidy.step_ngram <- function(x, ...) {
168168
if (is_trained(x)) {

R/pos_filter.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -144,8 +144,8 @@ print.step_pos_filter <-
144144
invisible(x)
145145
}
146146

147-
#' @rdname tidy.recipe
148-
#' @param x A `step_pos_filter` object.
147+
#' @rdname step_pos_filter
148+
#' @usage NULL
149149
#' @export
150150
tidy.step_pos_filter <- function(x, ...) {
151151
if (is_trained(x)) {

R/sequence_onehot.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -206,8 +206,8 @@ print.step_sequence_onehot <-
206206
invisible(x)
207207
}
208208

209-
#' @rdname tidy.recipe
210-
#' @param x A `step_sequence_onehot` object.
209+
#' @rdname step_sequence_onehot
210+
#' @usage NULL
211211
#' @export
212212
tidy.step_sequence_onehot <- function(x, ...) {
213213
if (is_trained(x)) {

R/stem.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -166,8 +166,8 @@ print.step_stem <-
166166
invisible(x)
167167
}
168168

169-
#' @rdname tidy.recipe
170-
#' @param x A `step_stem` object.
169+
#' @rdname step_stem
170+
#' @usage NULL
171171
#' @export
172172
tidy.step_stem <- function(x, ...) {
173173
if (is_trained(x)) {

0 commit comments

Comments
 (0)