Skip to content

Commit 559e51c

Browse files
committed
Typos
1 parent d992fc0 commit 559e51c

18 files changed

+26
-26
lines changed

R/aaa_models.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -277,7 +277,7 @@ check_interface_val <- function(x) {
277277
#' @param eng A single character string for the model engine.
278278
#' @param arg A single character string for the model argument name.
279279
#' @param has_submodel A single logical for whether the argument
280-
#' can make predictions on mutiple submodels at once.
280+
#' can make predictions on multiple submodels at once.
281281
#' @param func A named character vector that describes how to call
282282
#' a function. `func` should have elements `pkg` and `fun`. The
283283
#' former is optional but is recommended and the latter is

R/aaa_multi_predict.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -44,7 +44,7 @@ predict.model_spec <- function(object, ...) {
4444
#'
4545
#' `has_multi_predict()` tests to see if an object can make multiple
4646
#' predictions on submodels from the same object. `multi_predict_args()`
47-
#' returns the names of the argments to `multi_predict()` for this model
47+
#' returns the names of the arguments to `multi_predict()` for this model
4848
#' (if any).
4949
#' @param object An object to test.
5050
#' @param ... Not currently used.

R/boost_tree.R

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -30,22 +30,22 @@
3030
#' @param mode A single character string for the type of model.
3131
#' Possible values for this model are "unknown", "regression", or
3232
#' "classification".
33-
#' @param mtry An number for the number (or proportion) of predictors that will
33+
#' @param mtry A number for the number (or proportion) of predictors that will
3434
#' be randomly sampled at each split when creating the tree models (`xgboost`
3535
#' only).
3636
#' @param trees An integer for the number of trees contained in
3737
#' the ensemble.
3838
#' @param min_n An integer for the minimum number of data points
3939
#' in a node that are required for the node to be split further.
40-
#' @param tree_depth An integer for the maximum deopth of the tree (i.e. number
40+
#' @param tree_depth An integer for the maximum depth of the tree (i.e. number
4141
#' of splits) (`xgboost` only).
4242
#' @param learn_rate A number for the rate at which the boosting algorithm adapts
4343
#' from iteration-to-iteration (`xgboost` only).
4444
#' @param loss_reduction A number for the reduction in the loss function required
4545
#' to split further (`xgboost` only).
46-
#' @param sample_size An number for the number (or proportion) of data that is
46+
#' @param sample_size A number for the number (or proportion) of data that is
4747
#' exposed to the fitting routine. For `xgboost`, the sampling is done at at
48-
#' each iteration while `C5.0` samples once during traning.
48+
#' each iteration while `C5.0` samples once during training.
4949
#' @details
5050
#' The data given to the function are not saved and are only used
5151
#' to determine the _mode_ of the model. For `boost_tree()`, the
@@ -277,7 +277,7 @@ check_args.boost_tree <- function(object) {
277277
#' @param colsample_bytree Subsampling proportion of columns.
278278
#' @param min_child_weight A numeric value for the minimum sum of instance
279279
#' weights needed in a child to continue to split.
280-
#' @param gamma An number for the minimum loss reduction required to make a
280+
#' @param gamma A number for the minimum loss reduction required to make a
281281
#' further partition on a leaf node of the tree
282282
#' @param subsample Subsampling proportion of rows.
283283
#' @param ... Other options to pass to `xgb.train`.

R/descriptors.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -12,7 +12,7 @@
1212
#' \item `.obs()`: The current number of rows in the data set.
1313
#' \item `.preds()`: The number of columns in the data set that are
1414
#' associated with the predictors prior to dummy variable creation.
15-
#' \item `.cols()`: The number of predictor columns availible after dummy
15+
#' \item `.cols()`: The number of predictor columns available after dummy
1616
#' variables are created (if any).
1717
#' \item `.facts()`: The number of factor predictors in the dat set.
1818
#' \item `.lvls()`: If the outcome is a factor, this is a table

R/linear_reg.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -19,7 +19,7 @@
1919
#' @inheritParams boost_tree
2020
#' @param mode A single character string for the type of model.
2121
#' The only possible value for this model is "regression".
22-
#' @param penalty An non-negative number representing the total
22+
#' @param penalty A non-negative number representing the total
2323
#' amount of regularization (`glmnet`, `keras`, and `spark` only).
2424
#' For `keras` models, this corresponds to purely L2 regularization
2525
#' (aka weight decay) while the other models can be a combination
@@ -338,7 +338,7 @@ predict_raw._elnet <- function(object, new_data, opts = list(), ...) {
338338
#' @importFrom tidyr gather
339339
#' @export
340340
#'@rdname multi_predict
341-
#' @param penalty An numeric vector of penalty values.
341+
#' @param penalty A numeric vector of penalty values.
342342
multi_predict._elnet <-
343343
function(object, new_data, type = NULL, penalty = NULL, ...) {
344344
if (any(names(enquos(...)) == "newdata"))

R/logistic_reg.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -19,7 +19,7 @@
1919
#' @inheritParams boost_tree
2020
#' @param mode A single character string for the type of model.
2121
#' The only possible value for this model is "classification".
22-
#' @param penalty An non-negative number representing the total
22+
#' @param penalty A non-negative number representing the total
2323
#' amount of regularization (`glmnet`, `keras`, and `spark` only).
2424
#' For `keras` models, this corresponds to purely L2 regularization
2525
#' (aka weight decay) while the other models can be a combination

R/multinom_reg.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -19,7 +19,7 @@
1919
#' @inheritParams boost_tree
2020
#' @param mode A single character string for the type of model.
2121
#' The only possible value for this model is "classification".
22-
#' @param penalty An non-negative number representing the total
22+
#' @param penalty A non-negative number representing the total
2323
#' amount of regularization (`glmnet`, `keras`, and `spark` only).
2424
#' For `keras` models, this corresponds to purely L2 regularization
2525
#' (aka weight decay) while the other models can be a combination

R/nullmodel.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -128,7 +128,7 @@ predict.nullmodel <- function (object, new_data = NULL, type = NULL, ...) {
128128
#' General Interface for null models
129129
#'
130130
#' `null_model()` is a way to generate a _specification_ of a model before
131-
#' fitting and allows the model to be created using R. It doens't have any
131+
#' fitting and allows the model to be created using R. It doesn't have any
132132
#' main arguments.
133133
#'
134134
#' @param mode A single character string for the type of model.

man/boost_tree.Rd

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

man/descriptors.Rd

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

man/has_multi_predict.Rd

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

man/linear_reg.Rd

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

man/logistic_reg.Rd

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

man/multi_predict.Rd

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

man/multinom_reg.Rd

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

man/null_model.Rd

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

man/set_new_model.Rd

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

man/xgb_train.Rd

Lines changed: 1 addition & 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)