Code
hoist(df, x, "b", .ptype = list(b = double()))
Condition
Error in `hoist()`:
! Can't convert `..1` <list> to <double>.
Code
hoist(df, x, "b", .ptype = list(b = integer()))
Condition
Error in `hoist()`:
! `..1` must be a vector, not a symbol.
Code
df %>% hoist(y)
Condition
Error in `hoist()`:
! `.data[[.col]]` must be a list, not the number 1.
Code
df %>% hoist(x, 1)
Condition
Error in `hoist()`:
! All elements of `...` must be named.
Code
df %>% hoist(x, a = "a", a = "b")
Condition
Error in `hoist()`:
! The names of `...` must be unique.
Code
hoist(df, a, xx = 1)
Condition
Error in `hoist()`:
! `.data[[.col]]` must be a list, not a <tbl_df/tbl/data.frame> object.
Code
hoist(1)
Condition
Error in `hoist()`:
! `.data` must be a data frame, not a number.
Code
hoist(df)
Condition
Error in `hoist()`:
! `.col` is absent but must be supplied.
Code
hoist(df, a, .remove = 1)
Condition
Error in `hoist()`:
! `.remove` must be `TRUE` or `FALSE`, not the number 1.
Code
hoist(df, a, .ptype = 1)
Condition
Error in `hoist()`:
! `.ptype` must be `NULL`, an empty ptype, or a named list of ptypes.
Code
hoist(df, a, .transform = 1)
Condition
Error in `hoist()`:
! `.transform` must be `NULL`, a function, or a named list of functions.
Code
hoist(df, a, .simplify = 1)
Condition
Error in `hoist()`:
! `.simplify` must be a list or a single `TRUE` or `FALSE`.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.