Skip to content

Commit

Permalink
Merge pull request #661 from r-lib/b-accel
Browse files Browse the repository at this point in the history
  • Loading branch information
krlmlr authored Jun 28, 2024
2 parents dfa4c65 + 6f6565b commit 7ccaec0
Show file tree
Hide file tree
Showing 2 changed files with 7 additions and 5 deletions.
5 changes: 0 additions & 5 deletions R/type.R
Original file line number Diff line number Diff line change
Expand Up @@ -94,11 +94,6 @@ format_type_sum <- function(x, width, ...) {
UseMethod("format_type_sum")
}

# https://github.com/r-lib/pkgdown/issues/1540
type_sum.accel <- function(x) {
I("kg m/s^2")
}

#' @export
#' @rdname format_type_sum
format_type_sum.default <- function(x, width, ...) {
Expand Down
7 changes: 7 additions & 0 deletions R/zzz.R
Original file line number Diff line number Diff line change
Expand Up @@ -36,6 +36,13 @@
#' @importFrom cli symbol
NULL

# https://github.com/r-lib/pkgdown/issues/1540
if (Sys.getenv("IN_PKGDOWN") != "") {
type_sum.accel <- function(x) {
I("kg m/s^2")
}
}

# nolint start
.onLoad <- function(libname, pkgname) {
# nolint end
Expand Down

0 comments on commit 7ccaec0

Please sign in to comment.