Skip to content

Commit

Permalink
typo in code
Browse files Browse the repository at this point in the history
  • Loading branch information
topepo committed Oct 16, 2024
1 parent 1fbbf92 commit 2bb7521
Show file tree
Hide file tree
Showing 8 changed files with 8 additions and 8 deletions.
2 changes: 1 addition & 1 deletion R/logistic_reg-predict.R
Original file line number Diff line number Diff line change
Expand Up @@ -15,7 +15,7 @@
#'
#' @examples
#' \donttest{
#' if (torch::torch_is_installed() & rlang::is_installed(c("recipes", "yardstick", "modeldata")))) {
#' if (torch::torch_is_installed() & rlang::is_installed(c("recipes", "yardstick", "modeldata"))) {
#'
#' library(recipes)
#' library(yardstick)
Expand Down
2 changes: 1 addition & 1 deletion R/mlp-fit.R
Original file line number Diff line number Diff line change
Expand Up @@ -128,7 +128,7 @@
#'
#' @examples
#' \donttest{
#' if (torch::torch_is_installed() & rlang::is_installed(c("recipes", "yardstick", "modeldata")))) {
#' if (torch::torch_is_installed() & rlang::is_installed(c("recipes", "yardstick", "modeldata"))) {
#'
#' ## -----------------------------------------------------------------------------
#' # regression examples (increase # epochs to get better results)
Expand Down
2 changes: 1 addition & 1 deletion R/mlp-predict.R
Original file line number Diff line number Diff line change
Expand Up @@ -23,7 +23,7 @@
#'
#' @examples
#' \donttest{
#' if (torch::torch_is_installed() & rlang::is_installed(c("recipes", "modeldata")))) {
#' if (torch::torch_is_installed() & rlang::is_installed(c("recipes", "modeldata"))) {
#' # regression example:
#'
#' data(ames, package = "modeldata")
Expand Down
2 changes: 1 addition & 1 deletion R/multinomial_reg-predict.R
Original file line number Diff line number Diff line change
Expand Up @@ -15,7 +15,7 @@
#'
#' @examples
#' \donttest{
#' if (torch::torch_is_installed() & rlang::is_installed(c("recipes", "yardstick", "modeldata")))) {
#' if (torch::torch_is_installed() & rlang::is_installed(c("recipes", "yardstick", "modeldata"))) {
#'
#' library(recipes)
#' library(yardstick)
Expand Down
2 changes: 1 addition & 1 deletion man/brulee_mlp.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/predict.brulee_logistic_reg.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/predict.brulee_mlp.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/predict.brulee_multinomial_reg.Rd

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

0 comments on commit 2bb7521

Please sign in to comment.