Skip to content

Commit 4f4c16c

Browse files
committed
Make some function "internal"
1 parent 3cfbd44 commit 4f4c16c

File tree

7 files changed

+8
-2
lines changed

7 files changed

+8
-2
lines changed

R/data.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -7,7 +7,7 @@
77
#' @aliases model_db
88
#' @docType data
99
#' @return \item{model_db}{a data frame}
10-
#' @keywords datasets
10+
#' @keywords datasets internal
1111
#' @examples
1212
#' data(model_db)
1313
NULL

R/nullmodel.R

Lines changed: 2 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -31,7 +31,7 @@
3131
#'
3232
#' `predict.nullmodel()` returns either a factor or numeric vector
3333
#' depending on the class of \code{y}. All predictions are always the same.
34-
#' @keywords models
34+
#' @keywords models internal
3535
#' @examples
3636
#'
3737
#' outcome <- factor(sample(letters[1:2],
@@ -181,6 +181,7 @@ null_model <-
181181
#' @param ... Not used.
182182
#' @return A tibble with column `value`.
183183
#' @export
184+
#' @keywords internal
184185
#' @examples
185186
#'
186187
#' nullmodel(mtcars[,-1], mtcars$mpg) %>% tidy()

R/tidy_glmnet.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -9,6 +9,7 @@
99
#' @return A tibble with columns `term`, `estimate`, and `penalty`. When a
1010
#' multinomial mode is used, an additional `class` column is included.
1111
#' @importFrom stats coef
12+
#' @keywords internal
1213
#' @export
1314
tidy._elnet <- function(x, penalty = NULL, ...) {
1415
tidy_glmnet(x, penalty)

man/model_db.Rd

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

man/nullmodel.Rd

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

man/tidy._elnet.Rd

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

man/tidy.nullmodel.Rd

Lines changed: 1 addition & 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)