Skip to content

Commit

Permalink
apply analogous breaks change to time
Browse files Browse the repository at this point in the history
  • Loading branch information
simonpcouch committed Jul 15, 2024
1 parent 84d9311 commit fa35346
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/time.R
Original file line number Diff line number Diff line change
Expand Up @@ -210,7 +210,7 @@ bench_time_trans <- function(base = 10) {
if (is.null(base)) {
return(
scales::trans_new("bch:tm", as.numeric, as_bench_time,
scales::pretty_breaks(), domain = c(1e-100, Inf)
breaks = scales::pretty_breaks(), domain = c(1e-100, Inf)
)
)
}
Expand All @@ -219,7 +219,7 @@ bench_time_trans <- function(base = 10) {
inv <- function(x) as_bench_time(base ^ as.numeric(x))

scales::trans_new(paste0("bch:tm-", format(base)), trans, inv,
scales::log_breaks(base = base), domain = c(1e-100, Inf))
breaks = scales::log_breaks(base = base), domain = c(1e-100, Inf))
}

scale_type.bench_time <- function(x) "bench_time"
Expand Down

0 comments on commit fa35346

Please sign in to comment.