Skip to content

Commit

Permalink
fix check notes
Browse files Browse the repository at this point in the history
  • Loading branch information
dramanica committed Nov 4, 2023
1 parent 2c8c19a commit f18bad6
Show file tree
Hide file tree
Showing 11 changed files with 36 additions and 28 deletions.
2 changes: 2 additions & 0 deletions R/blockcv2rsample.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,6 +7,7 @@
#' @returns an `rsample` object
#' @export
#' @examples
#' \donttest{
#' library(blockCV)
#' points <- read.csv(system.file("extdata/", "species.csv", package = "blockCV"))
#' pa_data <- sf::st_as_sf(points, coords = c("x", "y"), crs = 7845)
Expand All @@ -20,6 +21,7 @@
#' ) # find evenly dispersed folds
#' sb1_rsample <- blockcv2rsample(sb1, pa_data)
#' class(sb1_rsample)
#' }
blockcv2rsample <- function(x, data) {
splits <- lapply(
x$folds_list,
Expand Down
3 changes: 2 additions & 1 deletion R/maxent.R
Original file line number Diff line number Diff line change
Expand Up @@ -14,6 +14,7 @@
#' @param regularization_multiplier numeric, a constant to adjust regularization
#' @returns a [`model_spec`] for a `maxent` model
#' @examples
#' \donttest{
#' # format the data
#' data("bradypus", package = "maxnet")
#' bradypus_tb <- tibble::as_tibble(bradypus) %>%
Expand Down Expand Up @@ -42,7 +43,7 @@
#' maxent_tune_res <- maxent_spec %>%
#' tune_grid(presence ~ ., cv, grid = 3)
#' show_best(maxent_tune_res, metric = "roc_auc")
#'
#' }
#' @export
maxent <-
function(mode = "classification", engine = "maxnet", feature_classes = NULL,
Expand Down
3 changes: 2 additions & 1 deletion R/plot_pres_vs_abs.R
Original file line number Diff line number Diff line change
Expand Up @@ -9,6 +9,7 @@
#' the first level of this factor
#' @returns a `patchwork` composite plot
#' @examples
#' \donttest{
#' data("bradypus", package = "maxnet")
#' bradypus_tb <- tibble::as_tibble(bradypus) %>%
#' dplyr::mutate(presence = relevel(
Expand All @@ -20,7 +21,7 @@
#' select(-ecoreg)
#'
#' bradypus_tb %>% plot_pres_vs_bg(presence)
#'
#' }
#' @export

plot_pres_vs_bg <- function(
Expand Down
2 changes: 2 additions & 0 deletions man/blockcv2rsample.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 2 additions & 1 deletion man/maxent.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

3 changes: 2 additions & 1 deletion man/plot_pres_vs_bg.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

10 changes: 5 additions & 5 deletions man/sample_pseudoabs_time.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

10 changes: 5 additions & 5 deletions man/sdm_spec_boost_tree.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

10 changes: 5 additions & 5 deletions man/sdm_spec_maxent.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

10 changes: 5 additions & 5 deletions man/sdm_spec_rand_forest.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

8 changes: 4 additions & 4 deletions man/simple_ensemble.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit f18bad6

Please sign in to comment.