Closed leeper closed 5 years ago
This is very similar to the anscombe example! The key is overwriting the auto generated .value
column to hold multiple values. Scroll down a bit at the below link:
https://tidyr.tidyverse.org/dev/articles/pivot.html#multiple-value-columns
library(tidyr)
library(dplyr, warn.conflicts = FALSE)
d <- data.frame(
x = 1:4,
y1 = rnorm(4),
y2 = rnorm(4),
z1 = rep(3,4),
z2 = rep(-2,4),
a = c(1,1,0,0),
b = c(0,1,1,1)
)
spec <- pivot_long_spec(d, c(y1, y2, z1, z2)) %>%
separate(name, c(".value", "time"), 1, convert = TRUE)
pivot_long(d, spec = spec)
#> # A tibble: 8 x 6
#> x a b time y z
#> <int> <dbl> <dbl> <int> <dbl> <dbl>
#> 1 1 1 0 1 -0.808 3
#> 2 1 1 0 2 0.491 -2
#> 3 2 1 1 1 -1.61 3
#> 4 2 1 1 2 -1.04 -2
#> 5 3 0 1 1 0.809 3
#> 6 3 0 1 2 2.26 -2
#> 7 4 0 1 1 -0.389 3
#> 8 4 0 1 2 -1.06 -2
reshape(
d,
varying = list(c("y1", "y2"), c("z1", "z2")),
v.names = c("y", "z"),
idvar = "x",
direction = "long"
) %>%
as_tibble() %>%
arrange(x, a, b)
#> # A tibble: 8 x 6
#> x a b time y z
#> <int> <dbl> <dbl> <int> <dbl> <dbl>
#> 1 1 1 0 1 -0.808 3
#> 2 1 1 0 2 0.491 -2
#> 3 2 1 1 1 -1.61 3
#> 4 2 1 1 2 -1.04 -2
#> 5 3 0 1 1 0.809 3
#> 6 3 0 1 2 2.26 -2
#> 7 4 0 1 1 -0.389 3
#> 8 4 0 1 2 -1.06 -2
Created on 2019-03-20 by the reprex package (v0.2.1.9000)
(BTW I think this example would be a little easier to understand if a
and b
were placed next to x
in the input, and it's probably worth printing the spec. I think it's worth adding to the vignette - it's similar to Anscombe, but this idea is complicated enough that a couple of examples would be worthwhile.)
Given that separate()
is often used in these examples, I wonder if it's worth having an additional argument to pivot_long()
that would somehow let you supply the basic syntax? (That said, it would have to be a novel syntax, because I think we could add at most one more argument to pivot_long()
)
The need to use separate() is pretty unintuitive.
@leeper could you please write a couple of sentences on why you consider this "panel" data? (i.e. something I could use to introduce a section in the vignette)
I don't currently see away to avoid separate()
with out encumbering pivot_long()
with many extra arguments — you need to be able to distinguish between the case of x_1
vs x1
(i.e. separate by match or by position), you might need to use extract()
instead, and there may be other variables caught up in the column headers.
But see discussion in #586.
@leeper to close the loop on this, the syntax is now:
pnl %>%
pivot_longer(-c(x, a, b), names_to = c(".value", "time"), names_sep = 1)
Sorry, not sure if you still need it but I'd say something like "Panel data consist of multiple cases/units/observations observed at multiple points in time. They feature commonly in economic, sociological, and political datasets, such as cross-country, over-time datasets like Gapminder."
What’s the opposite of panel data? Your description just sounds like data to me 😉
Here’s a definition from Wooldridge (a major econometrics textbook):
The distinction is from data that is only cross-sectional, or only anytime-series, or a repeated cross section of a population.
So is there a difference between panel data and longitudinal data or repeated measures?
I think those are all synonyms but used separately in different disciplines/literatures.
Would be great to have an example with a mix of time-variant and time-invariant variables for
gather()
orpivot_long()
or both. basically what's the tidyr equivalent of: