Skip to content

Commit

Permalink
Fix deprecation warning about trans
Browse files Browse the repository at this point in the history
  • Loading branch information
DavisVaughan committed Jan 16, 2025
1 parent 3dd50d7 commit ae9aa30
Show file tree
Hide file tree
Showing 2 changed files with 4 additions and 4 deletions.
4 changes: 2 additions & 2 deletions R/bytes.R
Original file line number Diff line number Diff line change
Expand Up @@ -201,12 +201,12 @@ scale_type.bench_bytes <- function(x) "bench_bytes"
#' @keywords internal
#' @export
scale_x_bench_bytes <- function(base = 10, ...) {
ggplot2::scale_x_continuous(..., trans = bench_bytes_trans(base = base))
ggplot2::scale_x_continuous(..., transform = bench_bytes_trans(base = base))
}

#' @rdname scale_bench_time
#' @keywords internal
#' @export
scale_y_bench_bytes <- function(base = 10, ...) {
ggplot2::scale_y_continuous(..., trans = bench_bytes_trans(base = base))
ggplot2::scale_y_continuous(..., transform = bench_bytes_trans(base = base))
}
4 changes: 2 additions & 2 deletions R/time.R
Original file line number Diff line number Diff line change
Expand Up @@ -244,12 +244,12 @@ scale_type.bench_time <- function(x) "bench_time"
#' @keywords internal
#' @export
scale_x_bench_time <- function(base = 10, ...) {
ggplot2::scale_x_continuous(..., trans = bench_time_trans(base = base))
ggplot2::scale_x_continuous(..., transform = bench_time_trans(base = base))
}

#' @rdname scale_bench_time
#' @keywords internal
#' @export
scale_y_bench_time <- function(base = 10, ...) {
ggplot2::scale_y_continuous(..., trans = bench_time_trans(base = base))
ggplot2::scale_y_continuous(..., transform = bench_time_trans(base = base))
}

0 comments on commit ae9aa30

Please sign in to comment.