Skip to content

Commit 7d9cca7

Browse files
committed
disabled Rd Sexpr until new data structure ready
1 parent 5dc131d commit 7d9cca7

28 files changed

+46
-135
lines changed

NAMESPACE

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -215,4 +215,3 @@ importFrom(utils,capture.output)
215215
importFrom(utils,getFromNamespace)
216216
importFrom(utils,globalVariables)
217217
importFrom(utils,head)
218-
importFrom(utils,stack)

R/aaa_models.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -38,7 +38,7 @@ pred_types <-
3838
#' @export
3939
get_model_env <- function() {
4040
current <- utils::getFromNamespace("parsnip", ns = "parsnip")
41-
# current <- get("parsnip")
41+
# current <- parsnip
4242
current
4343
}
4444

@@ -581,4 +581,4 @@ show_model_info <- function(mod) {
581581
invisible(NULL)
582582
}
583583

584-
# ------------------------------------------------------------------------------
584+

R/boost_tree.R

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -67,23 +67,23 @@
6767
#'
6868
#' \pkg{xgboost} classification
6969
#'
70-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::boost_tree(mode = "classification"), "xgboost")}
70+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::boost_tree(mode = "classification"), "xgboost")}
7171
#'
7272
#' \pkg{xgboost} regression
7373
#'
74-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::boost_tree(mode = "regression"), "xgboost")}
74+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::boost_tree(mode = "regression"), "xgboost")}
7575
#'
7676
#' \pkg{C5.0} classification
7777
#'
78-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::boost_tree(mode = "classification"), "C5.0")}
78+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::boost_tree(mode = "classification"), "C5.0")}
7979
#'
8080
#' \pkg{spark} classification
8181
#'
82-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::boost_tree(mode = "classification"), "spark")}
82+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::boost_tree(mode = "classification"), "spark")}
8383
#'
8484
#' \pkg{spark} regression
8585
#'
86-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::boost_tree(mode = "regression"), "spark")}
86+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::boost_tree(mode = "regression"), "spark")}
8787
#'
8888
#' @note For models created using the spark engine, there are
8989
#' several differences to consider. First, only the formula

R/decision_tree.R

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -52,23 +52,23 @@
5252
#'
5353
#' \pkg{rpart} classification
5454
#'
55-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::decision_tree(mode = "classification"), "rpart")}
55+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::decision_tree(mode = "classification"), "rpart")}
5656
#'
5757
#' \pkg{rpart} regression
5858
#'
59-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::decision_tree(mode = "regression"), "rpart")}
59+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::decision_tree(mode = "regression"), "rpart")}
6060
#'
6161
#' \pkg{C5.0} classification
6262
#'
63-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::decision_tree(mode = "classification"), "C5.0")}
63+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::decision_tree(mode = "classification"), "C5.0")}
6464
#'
6565
#' \pkg{spark} classification
6666
#'
67-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::decision_tree(mode = "classification"), "spark")}
67+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::decision_tree(mode = "classification"), "spark")}
6868
#'
6969
#' \pkg{spark} regression
7070
#'
71-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::decision_tree(mode = "regression"), "spark")}
71+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::decision_tree(mode = "regression"), "spark")}
7272
#'
7373
#' @note For models created using the spark engine, there are
7474
#' several differences to consider. First, only the formula

R/linear_reg.R

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -50,23 +50,23 @@
5050
#'
5151
#' \pkg{lm}
5252
#'
53-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::linear_reg(), "lm")}
53+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::linear_reg(), "lm")}
5454
#'
5555
#' \pkg{glmnet}
5656
#'
57-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::linear_reg(), "glmnet")}
57+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::linear_reg(), "glmnet")}
5858
#'
5959
#' \pkg{stan}
6060
#'
61-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::linear_reg(), "stan")}
61+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::linear_reg(), "stan")}
6262
#'
6363
#' \pkg{spark}
6464
#'
65-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::linear_reg(), "spark")}
65+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::linear_reg(), "spark")}
6666
#'
6767
#' \pkg{keras}
6868
#'
69-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::linear_reg(), "keras")}
69+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::linear_reg(), "keras")}
7070
#'
7171
#' When using `glmnet` models, there is the option to pass
7272
#' multiple values (or no values) to the `penalty` argument. This

R/logistic_reg.R

Lines changed: 5 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -48,23 +48,23 @@
4848
#'
4949
#' \pkg{glm}
5050
#'
51-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::logistic_reg(), "glm")}
51+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::logistic_reg(), "glm")}
5252
#'
5353
#' \pkg{glmnet}
5454
#'
55-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::logistic_reg(), "glmnet")}
55+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::logistic_reg(), "glmnet")}
5656
#'
5757
#' \pkg{stan}
5858
#'
59-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::logistic_reg(), "stan")}
59+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::logistic_reg(), "stan")}
6060
#'
6161
#' \pkg{spark}
6262
#'
63-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::logistic_reg(), "spark")}
63+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::logistic_reg(), "spark")}
6464
#'
6565
#' \pkg{keras}
6666
#'
67-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::logistic_reg(), "keras")}
67+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::logistic_reg(), "keras")}
6868
#'
6969
#' When using `glmnet` models, there is the option to pass
7070
#' multiple values (or no values) to the `penalty` argument. This

R/mars.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -44,11 +44,11 @@
4444
#'
4545
#' \pkg{earth} classification
4646
#'
47-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mars(mode = "classification"), "earth")}
47+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mars(mode = "classification"), "earth")}
4848
#'
4949
#' \pkg{earth} regression
5050
#'
51-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mars(mode = "regression"), "earth")}
51+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mars(mode = "regression"), "earth")}
5252
#'
5353
#' Note that, when the model is fit, the \pkg{earth} package only has its
5454
#' namespace loaded. However, if `multi_predict` is used, the package is

R/mlp.R

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -62,19 +62,19 @@
6262
#'
6363
#' \pkg{keras} classification
6464
#'
65-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mlp(mode = "classification"), "keras")}
65+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mlp(mode = "classification"), "keras")}
6666
#'
6767
#' \pkg{keras} regression
6868
#'
69-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mlp(mode = "regression"), "keras")}
69+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mlp(mode = "regression"), "keras")}
7070
#'
7171
#' \pkg{nnet} classification
7272
#'
73-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mlp(mode = "classification"), "nnet")}
73+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mlp(mode = "classification"), "nnet")}
7474
#'
7575
#' \pkg{nnet} regression
7676
#'
77-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mlp(mode = "regression"), "nnet")}
77+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::mlp(mode = "regression"), "nnet")}
7878
#'
7979
#' @importFrom purrr map_lgl
8080
#' @seealso [varying()], [fit()]

R/multinom_reg.R

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -47,15 +47,15 @@
4747
#'
4848
#' \pkg{glmnet}
4949
#'
50-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::multinom_reg(), "glmnet")}
50+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::multinom_reg(), "glmnet")}
5151
#'
5252
#' \pkg{spark}
5353
#'
54-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::multinom_reg(), "spark")}
54+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::multinom_reg(), "spark")}
5555
#'
5656
#' \pkg{keras}
5757
#'
58-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::multinom_reg(), "keras")}
58+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::multinom_reg(), "keras")}
5959
#'
6060
#' When using `glmnet` models, there is the option to pass
6161
#' multiple values (or no values) to the `penalty` argument. This

R/nearest_neighbor.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -54,7 +54,7 @@
5454
#'
5555
#' \pkg{kknn} (classification or regression)
5656
#'
57-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::nearest_neighbor(), "kknn")}
57+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::nearest_neighbor(), "kknn")}
5858
#'
5959
#' @note
6060
#' For `kknn`, the underlying modeling function used is a restricted

R/nullmodel.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -147,11 +147,11 @@ predict.nullmodel <- function (object, new_data = NULL, type = NULL, ...) {
147147
#'
148148
#' \pkg{parsnip} classification
149149
#'
150-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::null_model(mode = "classification"), "parsnip")}
150+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::null_model(mode = "classification"), "parsnip")}
151151
#'
152152
#' \pkg{parsnip} regression
153153
#'
154-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::null_model(mode = "regression"), "parsnip")}
154+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::null_model(mode = "regression"), "parsnip")}
155155
#'
156156
#' @importFrom purrr map_lgl
157157
#' @seealso [varying()], [fit()]

R/rand_forest.R

Lines changed: 6 additions & 6 deletions
Original file line numberDiff line numberDiff line change
@@ -46,27 +46,27 @@
4646
#'
4747
#' \pkg{ranger} classification
4848
#'
49-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "classification"), "ranger")}
49+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "classification"), "ranger")}
5050
#'
5151
#' \pkg{ranger} regression
5252
#'
53-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "regression"), "ranger")}
53+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "regression"), "ranger")}
5454
#'
5555
#' \pkg{randomForests} classification
5656
#'
57-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "classification"), "randomForest")}
57+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "classification"), "randomForest")}
5858
#'
5959
#' \pkg{randomForests} regression
6060
#'
61-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "regression"), "randomForest")}
61+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "regression"), "randomForest")}
6262
#'
6363
#' \pkg{spark} classification
6464
#'
65-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "classification"), "spark")}
65+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "classification"), "spark")}
6666
#'
6767
#' \pkg{spark} regression
6868
#'
69-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "regression"), "spark")}
69+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::rand_forest(mode = "regression"), "spark")}
7070
#'
7171
#' For \pkg{ranger} confidence intervals, the intervals are
7272
#' constructed using the form `estimate +/- z * std_error`. For

R/surv_reg.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -47,11 +47,11 @@
4747
#'
4848
#' \pkg{flexsurv}
4949
#'
50-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::surv_reg(), "flexsurv")}
50+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::surv_reg(), "flexsurv")}
5151
#'
5252
#' \pkg{survreg}
5353
#'
54-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::surv_reg(), "survreg")}
54+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::surv_reg(), "survreg")}
5555
#'
5656
#' Note that `model = TRUE` is needed to produce quantile
5757
#' predictions when there is a stratification variable and can be

R/svm_poly.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -44,11 +44,11 @@
4444
#'
4545
#' \pkg{kernlab} classification
4646
#'
47-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::svm_poly(mode = "classification"), "kernlab")}
47+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::svm_poly(mode = "classification"), "kernlab")}
4848
#'
4949
#' \pkg{kernlab} regression
5050
#'
51-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::svm_poly(mode = "regression"), "kernlab")}
51+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::svm_poly(mode = "regression"), "kernlab")}
5252
#'
5353
#' @importFrom purrr map_lgl
5454
#' @seealso [varying()], [fit()]

R/svm_rbf.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -43,11 +43,11 @@
4343
#'
4444
#' \pkg{kernlab} classification
4545
#'
46-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::svm_rbf(mode = "classification"), "kernlab")}
46+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::svm_rbf(mode = "classification"), "kernlab")}
4747
#'
4848
#' \pkg{kernlab} regression
4949
#'
50-
#' \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::svm_rbf(mode = "regression"), "kernlab")}
50+
# \Sexpr[results=rd]{parsnip:::show_fit(parsnip:::svm_rbf(mode = "regression"), "kernlab")}
5151
#'
5252
#' @importFrom purrr map_lgl
5353
#' @seealso [varying()], [fit()]

man/boost_tree.Rd

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

man/decision_tree.Rd

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

man/linear_reg.Rd

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

man/logistic_reg.Rd

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

0 commit comments

Comments
 (0)