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

Because the current env might be locked already (e.g. sealed namespace).

When taking a function as an argument the number or the name of the arguments are usually also important (e.g. see https://github.com/r-lib/httr2/pull/279 where this is useful). This uses `format_arg()` from...

Tweak, so that rlang's site looks more like other tidyverse sites. This puts news to the left of the search bar. https://pkgdown.r-lib.org/articles/customise.html#navbar

Issue 1296 was closed saying the walrus must remain, so this section of this doc doesn't make sense anymore.

Unlike `warning()` and `stop()`, `base::message()` has an `appendLF` argument that is `TRUE` by default. This causes it to create conditions that include an _explicit_ rather than implicit trailing line feed....

Consider something like: ``` > options(error = rlang::entrace) > x local({ + readLines(x) + }) Error in file(con, "r") : (converted from warning) cannot open file '/tmp/no/such/file': No such file...

We were trying to add custom checking functions using `import-standalone_types_check.R` in https://github.com/tidymodels/dials/. And it would be nice if there was a way to add to the ways `obj_type_friendly()` works without...

``` r library(rlang) foo Error: #> ! Error `123` ``` Created on 2023-11-09 with [reprex v2.0.2.9000](https://reprex.tidyverse.org) Ideally this would be ``` #> Error: foo() #> ! Error `x` ```

I frequently check (in particular for data frames) that an object has certain names. E.g. from `tidyr::check_pivot_spec()` ```r if (!has_name(spec, ".name") || !has_name(spec, ".value")) { cli::cli_abort( "{.arg spec} must have...

I frequently see checks that something is named, especially when using `...`, e.g. in `httr2::req_template()`: ```r req_template 0 && !is_named(dots)) { cli::cli_abort("All elements of {.arg ...} must be named.") }...