Skip to content

Commit 613a91e

Browse files
committed
model conversions and keyword internal
1 parent 33f63d1 commit 613a91e

14 files changed

+1475
-891
lines changed

NAMESPACE

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -202,7 +202,6 @@ importFrom(stats,na.omit)
202202
importFrom(stats,na.pass)
203203
importFrom(stats,predict)
204204
importFrom(stats,qnorm)
205-
importFrom(stats,qt)
206205
importFrom(stats,quantile)
207206
importFrom(stats,setNames)
208207
importFrom(stats,terms)

R/boost_tree.R

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -261,6 +261,7 @@ check_args.boost_tree <- function(object) {
261261
#' @param subsample Subsampling proportion of rows.
262262
#' @param ... Other options to pass to `xgb.train`.
263263
#' @return A fitted `xgboost` object.
264+
#' @keywords internal
264265
#' @export
265266
xgb_train <- function(
266267
x, y,
@@ -432,6 +433,7 @@ xgb_by_tree <- function(tree, object, new_data, type, ...) {
432433
#' model in the printed output.
433434
#' @param ... Other arguments to pass.
434435
#' @return A fitted C5.0 model.
436+
#' @keywords internal
435437
#' @export
436438
C5.0_train <-
437439
function(x, y, weights = NULL, trials = 15, minCases = 2, sample = 0, ...) {

R/decision_tree.R

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -252,6 +252,7 @@ check_args.decision_tree <- function(object) {
252252
#' those cases.
253253
#' @param ... Other arguments to pass to either `rpart` or `rpart.control`.
254254
#' @return A fitted rpart model.
255+
#' @keywords internal
255256
#' @export
256257
rpart_train <-
257258
function(formula, data, weights = NULL, cp = 0.01, minsplit = 20, maxdepth = 30, ...) {

0 commit comments

Comments
 (0)