X = g^{-1}(Y).R/bijector-methods.R
tfb_inverse.RdReturns the inverse Bijector evaluation, i.e., X = g^{-1}(Y).
tfb_inverse(bijector, y, name = "inverse")
| bijector | The bijector to apply |
|---|---|
| y | Tensor. The input to the "inverse" evaluation. |
| name | name of the operation |
a tensor
Other bijector_methods:
tfb_forward_log_det_jacobian(),
tfb_forward(),
tfb_inverse_log_det_jacobian()
# \donttest{ b <- tfb_affine_scalar(shift = 1, scale = 2) x <- 10 y <- b %>% tfb_forward(x) b %>% tfb_inverse(y)#> tf.Tensor(10.0, shape=(), dtype=float32)# }