Skip to content

Commit 7487cfd

Browse files
committed
Remove internal keyword from vector ctor topics
1 parent 38e7b5a commit 7487cfd

File tree

3 files changed

+0
-4
lines changed

3 files changed

+0
-4
lines changed

R/vec-new.R

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -119,7 +119,6 @@ ll <- function(...) {
119119
#'
120120
#' @param n The vector length.
121121
#' @param names Names for the new vector.
122-
#' @keywords internal
123122
#' @examples
124123
#' new_list(10)
125124
#' new_logical(10)
@@ -175,7 +174,6 @@ new_list <- function(n, names = NULL) {
175174
#' @param names Names for the new vector. Defaults to the names of
176175
#' `x`. This can be a function to apply to the names of `x` as in
177176
#' [set_names()].
178-
#' @keywords internal
179177
#' @examples
180178
#' x <- 0:5
181179
#' rep_along(x, 1:2)

man/new-vector-along.Rd

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

man/new-vector.Rd

Lines changed: 0 additions & 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)