Skip to content

Commit 903494c

Browse files
committed
more R CMD check fixes
1 parent 3853675 commit 903494c

File tree

6 files changed

+16
-6
lines changed

6 files changed

+16
-6
lines changed

R/layers-preprocessing.R

Lines changed: 7 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1145,7 +1145,8 @@ function (object, factor, value_range = list(0L, 255L), seed = NULL,
11451145
#' the output will be `(x - mean) * factor + mean`
11461146
#' where `mean` is the mean value of the channel.
11471147
#'
1148-
#' @param value_range the range of values the incoming images will have.
1148+
#' @param value_range
1149+
#' The range of values the incoming images will have.
11491150
#' Represented as a two-number tuple written `tuple(low, high)`. This is
11501151
#' typically either `[0, 1]` or `[0, 255]` depending on how your
11511152
#' preprocessing pipeline is set up.
@@ -2114,6 +2115,11 @@ function (object, value_range = list(0L, 255L), num_ops = 2L,
21142115
#' passed float is sampled. In order to ensure the value is always the
21152116
#' same, please pass a tuple with two identical floats: `(0.5, 0.5)`.
21162117
#'
2118+
#' @param value_range
2119+
#' The range of values the input image can take.
2120+
#' Default is `(0, 255)`. Typically, this would be `(0, 1)`
2121+
#' for normalized images or `(0, 255)` for raw images.
2122+
#'
21172123
#' @param seed
21182124
#' Integer. Used to create a random seed.
21192125
#'

R/model-persistence.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -374,7 +374,7 @@ load_model_config <- function(filepath, custom_objects = NULL)
374374
#' - `jax2tf_kwargs`: Optional `dict`. Arguments for
375375
#' `jax2tf.convert`. See the documentation for
376376
#' [`jax2tf.convert`](
377-
#' https://github.com/google/jax/blob/main/jax/experimental/jax2tf/README.md).
377+
#' https://github.com/jax-ml/jax/blob/main/jax/experimental/jax2tf/README.md).
378378
#' If `native_serialization` and `polymorphic_shapes` are
379379
#' not provided, they will be automatically computed.
380380
#'

man/export_savedmodel.keras.src.models.model.Model.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/layer_random_color_degeneration.Rd

Lines changed: 4 additions & 0 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/layer_random_contrast.Rd

Lines changed: 1 addition & 1 deletion
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

man/layer_tfsm.Rd

Lines changed: 2 additions & 2 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)