rlang icon indicating copy to clipboard operation
rlang copied to clipboard

Low-level API for programming with R

Results 130 rlang issues
Sort by recently updated
recently updated
newest added

Add documentation section that mentions `rlang::args_error_context`. Update testing section

To avoid this problem: ``` r library(rlang) power1 function(x) x ^ !!exp #> #> #> [[2]] #> function(x) x ^ !!exp #> lapply(funs, \(f) structure(f, srcref= NULL)) #> [[1]] #>...

e.g. https://github.com/tidyverse/purrr/issues/1104

Something that could replace code like this: ```R if (!is_bare_list(dots)) { stop_input_type(dots, "a list") } if (!is_named(dots)) { cli::cli_abort( "All components of {.arg ...} must be named.", call = error_call...

Printing the function object does not recognise changes to formals done via `fn_fmls() function (a = 1, b = 2) #> - attr(*, "srcref")= 'srcref' int [1:8] 1 8 1...

I think this could just be `arg_match()` without a `multiple` argument?

If `check_installed()` is called in tests, we would get an error (non-interactive sessions) But could there be an option to skip the test instead? Thanks Edit: I mean when one...

In keras, I naively tried unpacking arguments with `!!!` like this, which resulted in an error: ```r initializers