Skip to content

Commit b578ad3

Browse files
committed
Rd fixes for R-devel (4.4)
1 parent bde106d commit b578ad3

File tree

6 files changed

+6
-6
lines changed

6 files changed

+6
-6
lines changed

R/backend.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1937,7 +1937,7 @@ k_permute_dimensions <- function(x, pattern) {
19371937
#'
19381938
#' @param shape Shape of the placeholder (integer list, may include `NULL`
19391939
#' entries).
1940-
#' @param ndim Number of axes of the tensor. At least one of {`shape`, `ndim`}
1940+
#' @param ndim Number of axes of the tensor. At least one of `shape` or `ndim`
19411941
#' must be specified. If both are specified, `shape` is used.
19421942
#' @param dtype Placeholder type.
19431943
#' @param sparse Logical, whether the placeholder should have a sparse type.

R/metrics.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -243,7 +243,7 @@ py_metric_wrapper <- function(py_fn, py_cls, formals=NULL, modifiers=NULL,
243243
#' @param thresholds (Optional) A list of floating point values to use as the
244244
#' thresholds for discretizing the curve. If set, the `num_thresholds`
245245
#' parameter is ignored. Values should be in `[0, 1]`. Endpoint thresholds equal
246-
#' to {-epsilon, 1+epsilon} for a small positive epsilon value will be
246+
#' to `{-epsilon, 1+epsilon}` for a small positive epsilon value will be
247247
#' automatically included with these to correctly handle predictions equal to
248248
#' exactly 0 or 1.
249249
#'

R/preprocessing.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -477,7 +477,7 @@ sequences_to_matrix <- function(tokenizer, sequences, mode = c("binary", "count"
477477
#'
478478
#' @param path Path to image file
479479
#' @param grayscale DEPRECATED use `color_mode="grayscale"`
480-
#' @param color_mode One of {`"grayscale"`, `"rgb"`, `"rgba"`}.
480+
#' @param color_mode One of `{"grayscale", "rgb", "rgba"}`.
481481
#' Default: `"rgb"`. The desired image format.
482482
#' @param target_size Either `NULL` (default to original size) or integer vector
483483
#' `(img_height, img_width)`.

man/image_load.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/k_placeholder.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/metric_auc.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.

0 commit comments

Comments
 (0)