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)) {

R/stopwords.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -180,8 +180,8 @@ print.step_stopwords <-
180180
invisible(x)
181181
}
182182

183-
#' @rdname tidy.recipe
184-
#' @param x A `step_stopwords` object.
183+
#' @rdname step_stopwords
184+
#' @usage NULL
185185
#' @export
186186
tidy.step_stopwords <- function(x, ...) {
187187
if (is_trained(x)) {

R/text_normalization.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -152,8 +152,8 @@ print.step_text_normalization <-
152152
invisible(x)
153153
}
154154

155-
#' @rdname tidy.recipe
156-
#' @param x A `step_text_normalization` object.
155+
#' @rdname step_text_normalization
156+
#' @usage NULL
157157
#' @export
158158
tidy.step_text_normalization <- function(x, ...) {
159159
if (is_trained(x)) {

R/textfeature.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -176,8 +176,8 @@ print.step_textfeature <-
176176
invisible(x)
177177
}
178178

179-
#' @rdname tidy.recipe
180-
#' @param x A `step_textfeature` object.
179+
#' @rdname step_textfeatures
180+
#' @usage NULL
181181
#' @export
182182
tidy.step_textfeature <- function(x, ...) {
183183
if (is_trained(x)) {

R/texthash.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -194,8 +194,8 @@ print.step_texthash <-
194194
invisible(x)
195195
}
196196

197-
#' @rdname tidy.recipe
198-
#' @param x A `step_texthash` object.
197+
#' @rdname step_texthash
198+
#' @usage NULL
199199
#' @export
200200
tidy.step_texthash <- function(x, ...) {
201201
if (is_trained(x)) {

R/tf.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -222,8 +222,8 @@ print.step_tf <-
222222
invisible(x)
223223
}
224224

225-
#' @rdname tidy.recipe
226-
#' @param x A `step_tf` object.
225+
#' @rdname step_tf
226+
#' @usage NULL
227227
#' @export
228228
tidy.step_tf <- function(x, ...) {
229229
if (is_trained(x)) {

R/tfidf.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -214,8 +214,8 @@ print.step_tfidf <-
214214
invisible(x)
215215
}
216216

217-
#' @rdname tidy.recipe
218-
#' @param x A `step_tfidf` object.
217+
#' @rdname step_tfidf
218+
#' @usage NULL
219219
#' @export
220220
tidy.step_tfidf <- function(x, ...) {
221221
if (is_trained(x)) {

R/tidy.R

Lines changed: 0 additions & 10 deletions
This file was deleted.

R/tokenfilter.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -223,8 +223,8 @@ print.step_tokenfilter <-
223223
invisible(x)
224224
}
225225

226-
#' @rdname tidy.recipe
227-
#' @param x A `step_tokenfilter` object.
226+
#' @rdname step_tokenfilter
227+
#' @usage NULL
228228
#' @export
229229
tidy.step_tokenfilter <- function(x, ...) {
230230
if (is_trained(x)) {

R/tokenize.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -345,8 +345,8 @@ print.step_tokenize <-
345345
invisible(x)
346346
}
347347

348-
#' @rdname tidy.recipe
349-
#' @param x A `step_tokenize` object.
348+
#' @rdname step_tokenize
349+
#' @usage NULL
350350
#' @export
351351
tidy.step_tokenize <- function(x, ...) {
352352
if (is_trained(x)) {

R/tokenize_bpe.R

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

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

R/tokenize_sentencepiece.R

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

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

R/tokenize_wordpiece.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -154,8 +154,8 @@ print.step_tokenize_wordpiece <-
154154
invisible(x)
155155
}
156156

157-
#' @rdname tidy.recipe
158-
#' @param x A `step_tokenize_wordpiece` object.
157+
#' @rdname step_tokenize_wordpiece
158+
#' @usage NULL
159159
#' @export
160160
tidy.step_tokenize_wordpiece <- function(x, ...) {
161161
if (is_trained(x)) {

R/tokenmerge.R

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

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

R/untokenize.R

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

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

R/word_embeddings.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -237,8 +237,8 @@ print.step_word_embeddings <- function(x,
237237
invisible(x)
238238
}
239239

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

_pkgdown.yml

Lines changed: 0 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -62,6 +62,3 @@ reference:
6262
- title: Data Sets
6363
contents:
6464
- emoji_samples
65-
- title: Tidy Methods
66-
contents:
67-
- tidy.recipe

man/step_clean_levels.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_clean_names.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_dummy_hash.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_lda.Rd

Lines changed: 2 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_lemma.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_ngram.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_pos_filter.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_sequence_onehot.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_stem.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_stopwords.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_text_normalization.Rd

Lines changed: 1 addition & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/step_texthash.Rd

Lines changed: 2 additions & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)