Skip to content

Commit

Permalink
Add quiet arg to cran_check_results()
Browse files Browse the repository at this point in the history
Closes #17.
  • Loading branch information
gaborcsardi committed May 7, 2019
1 parent f23d138 commit f46c55f
Show file tree
Hide file tree
Showing 3 changed files with 11 additions and 3 deletions.
3 changes: 3 additions & 0 deletions NEWS.md
Original file line number Diff line number Diff line change
@@ -1,6 +1,9 @@

# dev

* `cran_check_results()` has now a `quiet` argument, and the download
progress bars are shown if it is set to `FALSE` (#17).

* Fix output when standard output does not support `\r`, typically when
it is not a terminal (#94).

Expand Down
6 changes: 4 additions & 2 deletions R/cran.R
Original file line number Diff line number Diff line change
Expand Up @@ -65,12 +65,14 @@ cran_check_flavours_generic <- function() {
#' @param package Name of a single package to download the checks for.
#' @param flavours CRAN check flavours to use. Defaults to all
#' flavours that were used to check the package.
#' @param quiet Whether to omit the download progress bars.
#' @return A list of `rcmdcheck` objects.
#'
#' @export

cran_check_results <- function(package,
flavours = cran_check_flavours(package)) {
flavours = cran_check_flavours(package),
quiet = TRUE) {

stopifnot(is_string(package))

Expand All @@ -81,7 +83,7 @@ cran_check_results <- function(package,
)

structure(
lapply(urls, parse_check_url),
lapply(urls, parse_check_url, quiet = quiet),
names = flavours,
package = package,
class = "rmcdcheck_cran_results"
Expand Down
5 changes: 4 additions & 1 deletion man/cran_check_results.Rd

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

0 comments on commit f46c55f

Please # to comment.