Skip to content

Commit

Permalink
US spelling
Browse files Browse the repository at this point in the history
  • Loading branch information
gaborcsardi committed Jun 15, 2023
1 parent 84afd50 commit cfa9f38
Show file tree
Hide file tree
Showing 2 changed files with 7 additions and 7 deletions.
10 changes: 5 additions & 5 deletions R/builder.R
Original file line number Diff line number Diff line change
Expand Up @@ -7,7 +7,7 @@
#'
#' @param pkg Package name.
#' @param library Library path.
#' @param flavour Platform flavour. Defaults to the `PKG_BUILD_FLAVOUR`
#' @param flavor Platform flavor. Defaults to the `PKG_BUILD_FLAVOR`
#' environment variable. If not `NULL` or an empty string, then it is
#' appended to the platform string with a dash.
#' @return Path to the built package.
Expand All @@ -16,16 +16,16 @@
#' @keywords internal

pkg_build <- function(pkg, library = .libPaths()[1],
flavour = Sys.getenv("PKG_BUILD_FLAVOUR")) {
flavor = Sys.getenv("PKG_BUILD_FLAVOR")) {
pkgdir <- file.path(library, pkg)
if (!dir.exists(pkgdir)) {
throw(pkg_error(
"Cannot find package {.pkg {pkg}} in library at {.path {library}}."
))
}
platform <- pkgcache::current_r_platform()
if (nzchar(flavour %||% "")) {
platform <- paste0(platform, "-", flavour)
if (nzchar(flavor %||% "")) {
platform <- paste0(platform, "-", flavor)
}
meta <- c(
RemoteBuildPlatform = platform,
Expand All @@ -43,7 +43,7 @@ pkg_build <- function(pkg, library = .libPaths()[1],
fn <- paste0(
pkg, "_", version, "_",
"R", rversion,
if (nzchar(flavour %||% "")) paste0("_", flavour),
if (nzchar(flavor %||% "")) paste0("_", flavor),
".zip"
)
zip::zip(fn, pkgdir, mode = "cherry-pick")
Expand Down
4 changes: 2 additions & 2 deletions man/pkg_build.Rd

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

0 comments on commit cfa9f38

Please sign in to comment.