Skip to content

Commit

Permalink
Merge pull request #374 from llrs/nrows
Browse files Browse the repository at this point in the history
Minor tweaks
  • Loading branch information
gaborcsardi authored Feb 12, 2024
2 parents 28cf59a + c28986f commit 7935e94
Show file tree
Hide file tree
Showing 2 changed files with 4 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/report.R
Original file line number Diff line number Diff line change
Expand Up @@ -56,7 +56,7 @@ revdep_report_summary <- function(pkg = ".", file = "", all = FALSE, results = N
}

revdep_report_section <- function(title, rows, file) {
if (nrow(rows) == 0) {
if (NROW(rows) == 0) {
return()
}

Expand Down Expand Up @@ -226,7 +226,7 @@ normalize_space <- function(x) {
}

cat_failure_section <- function(title, rows, file) {
if (nrow(rows) == 0) {
if (NROW(rows) == 0) {
return()
}

Expand Down
2 changes: 2 additions & 0 deletions R/revdepcheck.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,6 +7,8 @@
#' then reports the differences so you can see what checks were previously
#' ok but now fail.
#'
#' It requires to use a repos option that provides the source code of the packages not binaries.
#'
#' Once your package has been successfully submitted to CRAN, you should
#' run `revdep_reset()`. This deletes all files used for checking, freeing
#' up disk space and leaving you in a clean state for the next release.
Expand Down

0 comments on commit 7935e94

Please sign in to comment.