Home
last modified time | relevance | path

Searched refs:viapply (Results 1 – 21 of 21) sorted by relevance

/dports/devel/R-cran-lintr/lintr/R/
H A Dobject_usage_linter.R119 line1 = viapply(funs, get_attr, "line1"),
120 line2 = viapply(funs, get_attr, "line2"),
121 col1 = viapply(funs, get_attr, "col1"),
122 col2 = viapply(funs, get_attr, "col2"),
H A Dutils.R175 viapply <- function(x, ...) vapply(x, ..., FUN.VALUE = integer(1)) function
/dports/devel/R-cran-pkgcache/pkgcache/tests/testthat/
H A Dtest-utils.R13 viapply(l, length)
17 viapply(list(), length)
19 expect_error(viapply(l, identity), "values must be length 1")
20 expect_error(viapply(letters, identity), "values must be type .*integer")
/dports/devel/R-cran-cli/cli/tests/testthat/
H A Dtest-utils.R17 viapply(c("foo", "foobar"), length),
22 viapply(character(), length),
/dports/devel/R-cran-pkgcache/pkgcache/R/
H A Dutils.R10 viapply <- function(X, FUN, ...) { function
32 lens <- setdiff(unique(viapply(data, length)), 1L)
H A Daaa-async.R459 afrm <- viapply(frm, "[[", "frame")
474 res$def_id[afrm] <- viapply(frm, function(x) x$deferred)
1390 parents = I(list(viapply(private$parents, function(x) get_private(x)$id))),
1393 children = I(list(viapply(private$children, function(x) get_private(x)$id))),
2267 len <- viapply(private$lsts, length)
3905 viapply <- function(X, FUN, ..., FUN.VALUE = integer(1)) { function
4286 fd <- viapply(sess, function(x) conn_get_fileno(x$get_poll_connection()))
4291 pid = viapply(sess, function(x) x$get_pid()),
H A Dpackages-gz.R243 num_pkgs <- viapply(pkgslist, function(x) nrow(x$pkgs), USE.NAMES = FALSE)
H A Darchive.R385 lens <- viapply(archive, nrow)
H A Dmetadata-cache.R353 stat <- viapply(ret, function(x) x$response$status_code %||% 304L)
/dports/devel/R-cran-cli/cli/R/
H A Dspinner.R333 num_frames <- viapply(frames, length)
334 spin_width <- viapply(frames, function(x) max(nchar(x, type = "width")))
H A Daaa-utils.R97 viapply <- function(X, FUN, ..., USE.NAMES = TRUE) { function
H A Dcontainers.R67 bottom <- max(viapply(
/dports/devel/R-cran-cpp11/cpp11/R/
H A Dutils.R20 viapply <- function(x, f, ...) vapply(x, f, integer(1), ...) function
H A Dregister.R81 n_args = viapply(funs$args, nrow)
/dports/devel/R-cran-pkgcache/pkgcache/tests/async/
H A Dtest-worker-pool.R47 pids <- viapply(res, "[[", "result")
H A Dtest-call-function.R43 expect_true(is.integer(viapply(res, "[[", "result")))
/dports/devel/R-cran-remotes/remotes/R/
H A Dparse-git.R104 params <- params[viapply(params, nchar) > 0]
H A Dutils.R8 viapply <- function(X, FUN, ..., USE.NAMES = TRUE) { function
/dports/devel/R-cran-covr/covr/R/
H A Dutils.R10 x[viapply(x, length) != 0]
340 viapply <- function(X, FUN, ...) vapply(X, FUN, ..., FUN.VALUE = integer(1)) function
H A Dsummary_functions.R209 viapply(mrks, `[[`, "line"),
/dports/devel/R-cran-remotes/remotes/inst/
H A Dinstall-github.R4878 params <- params[viapply(params, nchar) > 0]
5179 viapply <- function(X, FUN, ..., USE.NAMES = TRUE) { function