lobstr icon indicating copy to clipboard operation
lobstr copied to clipboard

Understanding complex R objects with tools similar to str()

Results 15 lobstr issues
Sort by recently updated
recently updated
newest added

I'm seeing this error pop up inside of RStudio when attempting to call `lobstr::obj_size()`. I'm working on attempting to make a reprex. Just wanted to see if this is a...

bug

`make_type_abrev()` and `type_sum()` are inconsistent, and I think neither are correct. If it's a vector (how do we tell?) we should probably use `vctrs::type_sum()` (+ `vctrs::vec_size()` ?) and otherwise use...

feature

Fixes #48 @lionel- have you heard of these?

I was using `rlang::blast()`, and trying to understand how it works. `lazyeval::ast_()` shows the actual call: ```R blast ┗ () #> ┗ `~ #> ┗ () #> ┗ `+ #>...

feature

Starting to noodle on this idea because I think it will be useful for the data structures chapter in R4DS ``` R # Atomic vectors ---------------------------------------------------------- # Compactly displays type...

feature

To print ALTREP objects. The inspect method typically provides more information about the object. E.g. ```r ❯ .Internal(inspect(1:100)) @7fa458bec718 13 INTSXP g0c0 [NAM(7)] 1 : 100 (compact) ❯ lobstr::sxp(1:100) [1:0x7fa458be6a60]...

feature

(I'm happy to take a stab at this if it seems useful! cc @filipsch who is interested in this issue) Really enjoyed the NYC R conference talk on lobstr! This...

feature

As discussed in r-lib/rlang#678 I recently needed to log what symbols are getting hit in my data_mask using `eval_tidy`. @lionel- thought this might be a more appropriate home. I have...

feature

``` r library(rlang) library(lobstr) q1 Please use `quo_squash()` instead #> This warning is displayed once per session. #> █─`+` #> ├─x #> └─x ``` Created on 2018-11-08 by the [reprex...

feature