Skip to content

Commit

Permalink
Add support for passing custom check args to the jobs
Browse files Browse the repository at this point in the history
  • Loading branch information
jimhester committed Nov 3, 2021
1 parent 1ba55f7 commit 31cadc3
Show file tree
Hide file tree
Showing 2 changed files with 8 additions and 3 deletions.
6 changes: 4 additions & 2 deletions R/cloud.R
Original file line number Diff line number Diff line change
Expand Up @@ -163,13 +163,14 @@ cloud_fetch_results <- function(job_name = cloud_job(pkg = pkg), pkg = ".") {
#' @param revdep_packages A character vector of packages to check, if `NULL`
#' equal to [cran_revdeps()]
#' @param r_version The R version to use.
#' @param check_args Additional argument to pass to `R CMD check`
#' @returns The AWS Batch job-id
#' @inheritParams revdep_check
#' @importFrom cli cli_alert_info cli_alert_success cli_alert_danger
#' @importFrom httr GET PATCH POST stop_for_status add_headers content
#' @family cloud
#' @export
cloud_check <- function(pkg = ".", tarball = NULL, revdep_packages = NULL, r_version = "4.0.3") {
cloud_check <- function(pkg = ".", tarball = NULL, revdep_packages = NULL, r_version = "4.0.3", check_args = "--no-manual") {
if (is.null(tarball)) {
pkg <- pkg_check(pkg)
tarball <- pkgbuild::build(path = pkg)
Expand All @@ -190,7 +191,8 @@ cloud_check <- function(pkg = ".", tarball = NULL, revdep_packages = NULL, r_ver
package_name = package_name,
package_version = package_version,
revdep_packages = revdep_packages,
r_version = r_version
r_version = r_version,
check_args = check_args
),
encode = "json"
)
Expand Down
5 changes: 4 additions & 1 deletion man/cloud_check.Rd

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

0 comments on commit 31cadc3

Please sign in to comment.