Skip to content

Commit beb1c5e

Browse files
authored
Correct typo.
1 parent 7e0ec69 commit beb1c5e

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

R/mlp.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -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)