Skip to content

Commit

Permalink
incorporate into exponential transformation
Browse files Browse the repository at this point in the history
  • Loading branch information
teunbrand committed Oct 4, 2024
1 parent b2cdbff commit 1f13238
Showing 1 changed file with 2 additions and 1 deletion.
3 changes: 2 additions & 1 deletion R/transform-numeric.R
Original file line number Diff line number Diff line change
Expand Up @@ -255,7 +255,8 @@ transform_exp <- function(base = exp(1)) {
function(x) base^x,
function(x) log(x, base = base),
d_transform = function(x) base^x * log(base),
d_inverse = function(x) 1 / x / log(base)
d_inverse = function(x) 1 / x / log(base),
breaks = breaks_exp(),
)
}

Expand Down

0 comments on commit 1f13238

Please sign in to comment.