tibble icon indicating copy to clipboard operation
tibble copied to clipboard

Warning when printing SQL S4 column

Open moodymudskipper opened this issue 3 years ago • 0 comments

# no problem
x <- tibble::tibble(A = DBI::SQL("a"))

# no problem
x$A
#> <SQL> a

# problem : we get a warning, though the tibble prints fine
x
#> Warning in class(x) <- c("glue", "character"): Setting class(x) to multiple
#> strings ("glue", "character", ...); result will no longer be an S4 object
#> # A tibble: 1 × 1
#>   A    
#>   <SQL>
#> 1 a

Created on 2022-08-31 by the reprex package (v2.0.1)

moodymudskipper avatar Aug 31 '22 12:08 moodymudskipper