Skip to content

Commit

Permalink
Merge pull request #1206 from tidymodels/right-amount-of-bangs
Browse files Browse the repository at this point in the history
  • Loading branch information
EmilHvitfeldt authored Sep 29, 2023
2 parents 9e00c87 + 0e3f73e commit e1044d7
Show file tree
Hide file tree
Showing 5 changed files with 9 additions and 9 deletions.
2 changes: 1 addition & 1 deletion R/rename.R
Original file line number Diff line number Diff line change
Expand Up @@ -34,7 +34,7 @@
#' vars <- c(var1 = "cyl", var2 = "am")
#' car_rec <-
#' recipe(~., data = mtcars) %>%
#' step_rename(!!vars)
#' step_rename(!!!vars)
#'
#' car_rec %>%
#' prep() %>%
Expand Down
8 changes: 4 additions & 4 deletions R/slice.R
Original file line number Diff line number Diff line change
Expand Up @@ -46,8 +46,8 @@
#' dplyr_test <-
#' iris %>%
#' as_tibble() %>%
#' slice(76:150) %>%
#' slice(1:3)
#' slice(76:150)
#'
#' rec_test <- bake(prepped, iris %>% slice(76:150))
#' all.equal(dplyr_test, rec_test)
#'
Expand All @@ -58,8 +58,8 @@
#'
#' qq_rec <-
#' recipe(~., data = iris) %>%
#' # Embed `keep_rows` in the call using !!
#' step_slice(!!keep_rows) %>%
#' # Embed `keep_rows` in the call using !!!
#' step_slice(!!!keep_rows) %>%
#' prep(training = iris)
#'
#' tidy(qq_rec, number = 1)
Expand Down
2 changes: 1 addition & 1 deletion man/step_dummy_extract.Rd

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

2 changes: 1 addition & 1 deletion man/step_rename.Rd

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

4 changes: 2 additions & 2 deletions man/step_slice.Rd

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

0 comments on commit e1044d7

Please sign in to comment.