Skip to content

Commit 9ea567a

Browse files
committed
fixes for r-hub checks
1 parent 2d57692 commit 9ea567a

File tree

4 files changed

+10
-2
lines changed

4 files changed

+10
-2
lines changed

.Rbuildignore

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -1,3 +1,5 @@
1+
^tests/testthat/*\.log$
2+
^tests/testthat/logs$
13
^_pkgdown\.yml$
24
^docs$
35
^pkgdown$

R/boost_tree.R

Lines changed: 6 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -500,3 +500,9 @@ C50_by_tree <- function(tree, object, new_data, type, ...) {
500500
pred[[".row"]] <- 1:nrow(new_data)
501501
pred[, c(".row", "trees", nms)]
502502
}
503+
504+
505+
# ------------------------------------------------------------------------------
506+
507+
#' @importFrom utils globalVariables
508+
utils::globalVariables(c(".row"))

R/decision_tree.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -228,7 +228,7 @@ check_args.decision_tree <- function(object) {
228228

229229
#' Decision trees via rpart
230230
#'
231-
#' `rpart_train` is a wrapper for [rpart::rpart()] tree-based models
231+
#' `rpart_train` is a wrapper for `rpart()` tree-based models
232232
#' where all of the model arguments are in the main function.
233233
#'
234234
#' @param formula A model formula.

man/rpart_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)