Split a column (each element is a vector) to multiple columns

a little bit shorter

library(tidyverse)
tribble(
    ~a,
    1:3,
    4:6) %>%
    mutate(b = map(a, ~as_tibble(split(., letters[1:3])))) %>%
    unnest(b, .drop = FALSE)
#> # A tibble: 2 x 4
#>   a            a1     b     c
#>   <list>    <int> <int> <int>
#> 1 <int [3]>     1     2     3
#> 2 <int [3]>     4     5     6

Created on 2018-09-10 by the reprex package (v0.2.0).

I'm thinking about it