Skip to content

Commit edf88ab

Browse files
topepohfrick
andauthored
add release bullets (#675)
* add release bullets * combine release bullets * use pkg-level docs * updated docs Co-authored-by: Hannah Frick <[email protected]>
1 parent 4976b64 commit edf88ab

File tree

4 files changed

+94
-41
lines changed

4 files changed

+94
-41
lines changed

R/0_imports.R

Lines changed: 0 additions & 20 deletions
This file was deleted.

R/aaa.R

Lines changed: 0 additions & 21 deletions
Original file line numberDiff line numberDiff line change
@@ -80,24 +80,3 @@ function(results, object) {
8080
}
8181
res
8282
}
83-
84-
# ------------------------------------------------------------------------------
85-
# nocov start
86-
87-
utils::globalVariables(
88-
c('.', '.label', '.pred', '.row', 'data', 'engine', 'engine2', 'group',
89-
'lab', 'original', 'predicted_label', 'prediction', 'value', 'type',
90-
"neighbors", ".submodels", "has_submodel", "max_neighbor", "max_penalty",
91-
"max_terms", "max_tree", "model", "name", "num_terms", "penalty", "trees",
92-
"sub_neighbors", ".pred_class", "x", "y", "predictor_indicators",
93-
"compute_intercept", "remove_intercept", "estimate", "term",
94-
"call_info", "component", "component_id", "func", "tunable", "label",
95-
"pkg", ".order", "item", "tunable", "has_ext"
96-
)
97-
)
98-
99-
release_bullets <- function() {
100-
c("Run `knit_engine_docs()` and `devtools::document()` to update docs")
101-
}
102-
103-
# nocov end

R/parsnip-package.R

Lines changed: 57 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -0,0 +1,57 @@
1+
#' parsnip
2+
#'
3+
#' The goal of parsnip is to provide a tidy, unified interface to models that
4+
#' can be used to try a range of models without getting bogged down in the
5+
#' syntactical minutiae of the underlying packages.
6+
#'
7+
#' @keywords internal
8+
"_PACKAGE"
9+
10+
## usethis namespace: start
11+
#' @importFrom dplyr arrange bind_cols bind_rows collect full_join group_by
12+
#' @importFrom dplyr mutate pull rename select starts_with summarise tally
13+
#' @importFrom generics varying_args
14+
#' @importFrom glue glue_collapse
15+
#' @importFrom purrr as_vector imap imap_lgl map map_chr map_dbl map_df map_dfr
16+
#' @importFrom purrr map_lgl %||%
17+
#' @importFrom rlang abort call2 caller_env current_env enquo enquos eval_tidy
18+
#' @importFrom rlang expr get_expr is_empty is_missing is_null is_quosure
19+
#' @importFrom rlang is_symbolic lgl missing_arg quo_get_expr quos sym syms
20+
#' @importFrom stats .checkMFClasses .getXlevels as.formula binomial coef
21+
#' @importFrom stats delete.response model.frame model.matrix model.offset
22+
#' @importFrom stats model.response model.weights na.omit na.pass predict qnorm
23+
#' @importFrom stats qt quantile setNames terms update
24+
#' @importFrom tibble as_tibble is_tibble tibble type_sum
25+
#' @importFrom tidyr gather
26+
#' @importFrom utils capture.output getFromNamespace globalVariables head
27+
#' @importFrom utils methods stack
28+
#' @importFrom vctrs vec_size vec_unique
29+
#' @importFrom ggplot2 autoplot
30+
## usethis namespace: end
31+
NULL
32+
33+
# nocov start
34+
35+
utils::globalVariables(
36+
c(
37+
'.', '.label', '.pred', '.row', 'data', 'engine', 'engine2', 'group',
38+
'lab', 'original', 'predicted_label', 'prediction', 'value', 'type',
39+
"neighbors", ".submodels", "has_submodel", "max_neighbor", "max_penalty",
40+
"max_terms", "max_tree", "model", "name", "num_terms", "penalty", "trees",
41+
"sub_neighbors", ".pred_class", "x", "y", "predictor_indicators",
42+
"compute_intercept", "remove_intercept", "estimate", "term",
43+
"call_info", "component", "component_id", "func", "tunable", "label",
44+
"pkg", ".order", "item", "tunable", "has_ext"
45+
)
46+
)
47+
48+
release_bullets <- function() {
49+
c(
50+
"Update parsnip add-in information at `inst/add-in/parsnip_model_db.R`",
51+
"Run `update_model_info_file()` and verify results",
52+
"Run `knit_engine_docs()` and `devtools::document()` to update docs"
53+
)
54+
}
55+
56+
# nocov end
57+

man/parsnip-package.Rd

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

0 commit comments

Comments
 (0)