Skip to content

Commit

Permalink
Add cloud_report_cran
Browse files Browse the repository at this point in the history
  • Loading branch information
jimhester committed May 18, 2020
1 parent bc634d4 commit b52d16f
Show file tree
Hide file tree
Showing 3 changed files with 13 additions and 0 deletions.
1 change: 1 addition & 0 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -20,6 +20,7 @@ export(cloud_job)
export(cloud_job_mapping)
export(cloud_plot)
export(cloud_report)
export(cloud_report_cran)
export(cloud_report_failures)
export(cloud_report_problems)
export(cloud_report_summary)
Expand Down
9 changes: 9 additions & 0 deletions R/cloud.R
Original file line number Diff line number Diff line change
Expand Up @@ -456,6 +456,15 @@ cloud_report_failures <- function(job_id = cloud_job(), pkg = ".", file = "", re
revdep_report_failures(pkg = pkg, file = file, results = results)
}

#' @rdname cloud_report
#' @export
cloud_report_cran <- function(job_id = cloud_job(), pkg = ".", results = NULL) {
if (is.null(results)) {
results <- cloud_results(job_id, pkg)
}
revdep_report_cran(pkg = pkg, results = results)
}

#' Retrieve cloud results
#'
#' Intended for expert use only, this can be used as input to the [cloud_report()] and other functions.
Expand Down
3 changes: 3 additions & 0 deletions man/cloud_report.Rd

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

0 comments on commit b52d16f

Please sign in to comment.