Skip to content

Commit fd32d66

Browse files
committed
documentation update
1 parent f3b4563 commit fd32d66

29 files changed

+946
-99
lines changed

NAMESPACE

Lines changed: 5 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -4,16 +4,20 @@ S3method(fit,model_spec)
44
S3method(print,linear_reg)
55
S3method(print,logistic_reg)
66
S3method(print,rand_forest)
7+
S3method(print,surv_reg)
78
S3method(translate,default)
89
S3method(translate,rand_forest)
10+
S3method(translate,surv_reg)
911
S3method(update,linear_reg)
1012
S3method(update,logistic_reg)
1113
S3method(update,rand_forest)
14+
S3method(update,surv_reg)
1215
export(fit)
1316
export(fit_control)
1417
export(linear_reg)
1518
export(logistic_reg)
1619
export(rand_forest)
20+
export(surv_reg)
1721
export(translate)
1822
export(varying)
1923
import(rlang)
@@ -25,6 +29,7 @@ importFrom(recipes,all_predictors)
2529
importFrom(recipes,juice)
2630
importFrom(recipes,prep)
2731
importFrom(stats,as.formula)
32+
importFrom(stats,formula)
2833
importFrom(stats,model.frame)
2934
importFrom(stats,model.matrix)
3035
importFrom(stats,model.response)

R/form_recipe.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1,7 +1,7 @@
11
# Class for creating an appropriate formula for a model based on the roles
22
# contained in the recipe.
33

4-
# maybe use `formula` generic with `formula.model_spec` acting as the generic?
4+
#' @importFrom stats formula
55

66
formula.model_spec <- function(x, recipe, ...) {
77
rec_vars <- summary(recipe)

R/linear_reg.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -106,9 +106,9 @@ print.linear_reg <- function(x, ...) {
106106
#' in lieu of recreating the object from scratch.
107107
#'
108108
#' @inheritParams linear_reg
109-
#' @param object A linear reression model specification.
109+
#' @param object A linear regression model specification.
110110
#' @param fresh A logical for whether the arguments should be
111-
#' modifed in-place of or replaced wholesale.
111+
#' modified in-place of or replaced wholesale.
112112
#' @return An updated model specification.
113113
#' @examples
114114
#' model <- linear_reg(regularization = 10, mixture = 0.1)

R/logistic_reg.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -106,9 +106,9 @@ print.logistic_reg <- function(x, ...) {
106106
#' in lieu of recreating the object from scratch.
107107
#'
108108
#' @inheritParams logistic_reg
109-
#' @param object A logistic reression model specification.
109+
#' @param object A logistic regression model specification.
110110
#' @param fresh A logical for whether the arguments should be
111-
#' modifed in-place of or replaced wholesale.
111+
#' modified in-place of or replaced wholesale.
112112
#' @return An updated model specification.
113113
#' @examples
114114
#' model <- logistic_reg(regularization = 10, mixture = 0.1)

R/rand_forest.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -103,7 +103,7 @@ print.rand_forest <- function(x, ...) {
103103
#' @inheritParams rand_forest
104104
#' @param object A random forest model specification.
105105
#' @param fresh A logical for whether the arguments should be
106-
#' modifed in-place of or replaced wholesale.
106+
#' modified in-place of or replaced wholesale.
107107
#' @return An updated model specification.
108108
#' @examples
109109
#' model <- rand_forest(mtry = 10, min_n = 3)
@@ -123,7 +123,7 @@ update.rand_forest <-
123123

124124
args <- list(mtry = mtry, trees = trees, min_n = min_n)
125125

126-
# TODO make these blocks into a function amd document well
126+
# TODO make these blocks into a function and document well
127127
if (fresh) {
128128
object$args <- args
129129
} else {

_pkgdown.yml

Lines changed: 7 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -2,15 +2,20 @@ template:
22
params:
33
bootswatch: united
44

5+
figures:
6+
fig.width: 8
7+
fig.height: 5.75
8+
59
reference:
610
- title: Models
711
contents:
8-
- rand_forest
12+
- linear_reg
913
- logistic_reg
14+
- rand_forest
15+
- surv_reg
1016
- title: Infrastructure
1117
contents:
1218
- translate
13-
- update
1419
- fit
1520
- fit_control
1621
- varying

docs/articles/index.html

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

docs/articles/parsnip_Intro.html

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

docs/authors.html

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

0 commit comments

Comments
 (0)