Skip to content

Commit b5f3936

Browse files
committed
tweak example
1 parent 5add916 commit b5f3936

File tree

2 files changed

+2
-2
lines changed

2 files changed

+2
-2
lines changed

R/utils.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -621,7 +621,7 @@ function(x,
621621
#' names(gradients) <- paste0("gradient_", 1:3)
622622
#' try(zip_lists(gradients, weights)) # error, names don't match
623623
#' # call unname directly for positional matching
624-
#' zip_lists(unname(gradients), unname(weights))
624+
#' str(zip_lists(unname(gradients), unname(weights)))
625625
zip_lists <- function(...) {
626626
dots <- list(...)
627627
if(length(dots) == 1)

man/zip_lists.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)