Skip to content

Commit 7d32c02

Browse files
authored
Merge pull request #317 from rorynolan/master
Fix a couple of documentation typos.
2 parents 924363e + 65c1fae commit 7d32c02

File tree

2 files changed

+3
-3
lines changed

2 files changed

+3
-3
lines changed

R/decision_tree.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -102,7 +102,7 @@ print.decision_tree <- function(x, ...) {
102102

103103
#' @export
104104
#' @inheritParams update.boost_tree
105-
#' @param object A random forest model specification.
105+
#' @param object A decision tree model specification.
106106
#' @examples
107107
#' model <- decision_tree(cost_complexity = 10, min_n = 3)
108108
#' model

R/mlp.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -37,7 +37,7 @@
3737
#' @param dropout A number between 0 (inclusive) and 1 denoting the proportion
3838
#' of model parameters randomly set to zero during model training.
3939
#' @param epochs An integer for the number of training iterations.
40-
#' @param activation A single character strong denoting the type of relationship
40+
#' @param activation A single character string denoting the type of relationship
4141
#' between the original predictors and the hidden unit layer. The activation
4242
#' function between the hidden and output layers is automatically set to either
4343
#' "linear" or "softmax" depending on the type of outcome. Possible values are:
@@ -105,7 +105,7 @@ print.mlp <- function(x, ...) {
105105
#'
106106
#' @export
107107
#' @inheritParams update.boost_tree
108-
#' @param object A random forest model specification.
108+
#' @param object A multilayer perceptron model specification.
109109
#' @examples
110110
#' model <- mlp(hidden_units = 10, dropout = 0.30)
111111
#' model

0 commit comments

Comments
 (0)