Skip to content

Commit

Permalink
BioConductor -> Bioconductor (#285)
Browse files Browse the repository at this point in the history
  • Loading branch information
HenrikBengtsson authored Dec 8, 2020
1 parent 5a82bd3 commit db3bc3b
Show file tree
Hide file tree
Showing 5 changed files with 5 additions and 5 deletions.
2 changes: 1 addition & 1 deletion R/deps-install.R
Original file line number Diff line number Diff line change
Expand Up @@ -46,7 +46,7 @@ deps_install_opts <- function(pkgdir, pkgname, quiet = FALSE, env = character())
}

deps_opts <- function(pkgname, exclude = character()) {
## We set repos, so that dependencies from BioConductor are installed
## We set repos, so that dependencies from Bioconductor are installed
## automatically
repos <- get_repos(bioc = TRUE)

Expand Down
2 changes: 1 addition & 1 deletion R/report.R
Original file line number Diff line number Diff line change
Expand Up @@ -290,7 +290,7 @@ revdep_report_cran <- function(pkg = ".", file = "", results = NULL) {
cat_line(
"We checked ", length(results), " reverse dependencies",
if (any(!on_cran))
paste0(" (", sum(on_cran), " from CRAN + ", sum(!on_cran), " from BioConductor)"),
paste0(" (", sum(on_cran), " from CRAN + ", sum(!on_cran), " from Bioconductor)"),
", comparing R CMD check results across CRAN and dev versions of this package.",
file = file
)
Expand Down
2 changes: 1 addition & 1 deletion R/revdepcheck.R
Original file line number Diff line number Diff line change
Expand Up @@ -39,7 +39,7 @@
#' @param timeout Maximum time to wait (in seconds) for `R CMD check` to
#' complete. Default is 10 minutes.
#' @param num_workers Number of parallel workers to use
#' @param bioc Also check revdeps that live in BioConductor?
#' @param bioc Also check revdeps that live in Bioconductor?
#' @param env Environment variables to set for the install and check
#' processes. See [revdep_env_vars()].
#'
Expand Down
2 changes: 1 addition & 1 deletion man/cran_revdeps.Rd

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

2 changes: 1 addition & 1 deletion man/revdep_check.Rd

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

0 comments on commit db3bc3b

Please sign in to comment.