Skip to content

Commit 993d038

Browse files
committed
change argument order
1 parent 1288124 commit 993d038

File tree

2 files changed

+3
-3
lines changed

2 files changed

+3
-3
lines changed

R/boost_tree.R

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -257,11 +257,11 @@ check_args.boost_tree <- function(object) {
257257
#' @keywords internal
258258
#' @export
259259
xgb_train <- function(
260-
x, y,
260+
x, y, weights = NULL,
261261
max_depth = 6, nrounds = 15, eta = 0.3, colsample_bynode = NULL,
262262
colsample_bytree = NULL, min_child_weight = 1, gamma = 0, subsample = 1,
263263
validation = 0, early_stop = NULL, objective = NULL, counts = TRUE,
264-
event_level = c("first", "second"), weights = NULL, ...) {
264+
event_level = c("first", "second"), ...) {
265265

266266
event_level <- rlang::arg_match(event_level, c("first", "second"))
267267
others <- list(...)

man/xgb_train.Rd

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

0 commit comments

Comments
 (0)