我在把我的数据帧从宽表转换成长表时遇到了一些麻烦。 目前它看起来是这样的:

Code Country        1950    1951    1952    1953    1954
AFG  Afghanistan    20,249  21,352  22,532  23,557  24,555
ALB  Albania        8,097   8,986   10,058  11,123  12,246

现在我想把这个数据。帧转换成一个长数据。帧。 就像这样:

Code Country        Year    Value
AFG  Afghanistan    1950    20,249
AFG  Afghanistan    1951    21,352
AFG  Afghanistan    1952    22,532
AFG  Afghanistan    1953    23,557
AFG  Afghanistan    1954    24,555
ALB  Albania        1950    8,097
ALB  Albania        1951    8,986
ALB  Albania        1952    10,058
ALB  Albania        1953    11,123
ALB  Albania        1954    12,246

我已经看过并尝试过使用melt()和重塑()函数 就像一些人在类似的问题中暗示的那样。 然而,到目前为止,我只得到混乱的结果。

如果可能的话,我想用重塑()函数来做 它看起来更好处理一些。


当前回答

使用重塑包:

#data
x <- read.table(textConnection(
"Code Country        1950    1951    1952    1953    1954
AFG  Afghanistan    20,249  21,352  22,532  23,557  24,555
ALB  Albania        8,097   8,986   10,058  11,123  12,246"), header=TRUE)

library(reshape)

x2 <- melt(x, id = c("Code", "Country"), variable_name = "Year")
x2[,"Year"] <- as.numeric(gsub("X", "" , x2[,"Year"]))

其他回答

重塑()需要一段时间才能适应,就像melt/cast一样。下面是一个使用重塑的解决方案,假设你的数据帧叫做d:

reshape(d, 
        direction = "long",
        varying = list(names(d)[3:7]),
        v.names = "Value",
        idvar = c("Code", "Country"),
        timevar = "Year",
        times = 1950:1954)

使用重塑包:

#data
x <- read.table(textConnection(
"Code Country        1950    1951    1952    1953    1954
AFG  Afghanistan    20,249  21,352  22,532  23,557  24,555
ALB  Albania        8,097   8,986   10,058  11,123  12,246"), header=TRUE)

library(reshape)

x2 <- melt(x, id = c("Code", "Country"), variable_name = "Year")
x2[,"Year"] <- as.numeric(gsub("X", "" , x2[,"Year"]))

下面是另一个展示使用tidyr中的gather的示例。您可以通过单独删除列来选择要收集的列(就像我在这里所做的那样),或者通过显式地包括您想要的年份来选择列。

注意,为了处理逗号(如果没有设置check.names = FALSE,则添加X),我还使用dplyr的mutate with parse_number from readr将文本值转换回数字。这些都是tidyverse的一部分,因此可以通过库(tidyverse)一起加载。

wide %>%
  gather(Year, Value, -Code, -Country) %>%
  mutate(Year = parse_number(Year)
         , Value = parse_number(Value))

返回:

   Code     Country Year Value
1   AFG Afghanistan 1950 20249
2   ALB     Albania 1950  8097
3   AFG Afghanistan 1951 21352
4   ALB     Albania 1951  8986
5   AFG Afghanistan 1952 22532
6   ALB     Albania 1952 10058
7   AFG Afghanistan 1953 23557
8   ALB     Albania 1953 11123
9   AFG Afghanistan 1954 24555
10  ALB     Albania 1954 12246

两种解决方案:

1)用data.table:

你可以使用melt函数:

library(data.table)
long <- melt(setDT(wide), id.vars = c("Code","Country"), variable.name = "year")

这使:

长> 国家代码年值 1: AFG阿富汗1950 20,249 2: ALB阿尔巴尼亚1950 8097 第3集:AFG阿富汗1951 21,352 4: ALB阿尔巴尼亚1951 8,986 5:阿富汗空军1952 22,532 第6集:ALB阿尔巴尼亚1952 10058 7:阿富汗空军1953年23,557 8:阿尔巴尼亚1953年11,123 9:阿富汗空军1954 24555 10:阿尔巴尼亚1954年12,246

其他表示法:

melt(setDT(wide), id.vars = 1:2, variable.name = "year")
melt(setDT(wide), measure.vars = 3:7, variable.name = "year")
melt(setDT(wide), measure.vars = as.character(1950:1954), variable.name = "year")

2)带着整洁:

使用pivot_longer ():

library(tidyr)

long <- wide %>% 
  pivot_longer(
    cols = `1950`:`1954`, 
    names_to = "year",
    values_to = "value"
)

注意:

names_to and values_to default to "name" and "value", respectively, so you could write this extra-succinctly as wide %>% pivot_longer(`1950`:`1954`). The cols argument uses the highly flexible tidyselect DSL, so you can select the same columns using a negative selection (!c(Code, Country)), a selection helper(starts_with("19"); matches("^\\d{4}$")), numeric indices (3:7), and more. tidyr::pivot_longer() is the successor to tidyr::gather() and reshape2::melt(), which are no longer under development.

改变值

数据的另一个问题是,值将被R读取为字符值(作为数字中的,的结果)。你可以用gsub和as来修复。数值,或者在重塑之前:

long$value <- as.numeric(gsub(",", "", long$value))

或者在重塑过程中,使用数据。表或tidyr:

# data.table
long <- melt(setDT(wide),
             id.vars = c("Code","Country"),
             variable.name = "year")[, value := as.numeric(gsub(",", "", value))]

# tidyr
long <- wide %>%
  pivot_longer(
    cols = `1950`:`1954`, 
    names_to = "year",
    values_to = "value",
    values_transform = ~ as.numeric(gsub(",", "", .x))
  )

数据:

wide <- read.table(text="Code Country        1950    1951    1952    1953    1954
AFG  Afghanistan    20,249  21,352  22,532  23,557  24,555
ALB  Albania        8,097   8,986   10,058  11,123  12,246", header=TRUE, check.names=FALSE)

由于这个答案被标记为R -faq,我觉得分享另一个来自基本R: stack的选项会很有用。

但是请注意,该堆栈不能与因子一起工作——只有在is时才能工作。vector为TRUE,从文档中可以看到is。向量,我们发现:

是多少。vector返回TRUE,如果x是指定模式的vector,除名称外没有其他属性。否则返回FALSE。

我使用来自@Jaap答案的示例数据,其中年份列中的值是因子。

下面是堆栈方法:

cbind(wide[1:2], stack(lapply(wide[-c(1, 2)], as.character)))
##    Code     Country values  ind
## 1   AFG Afghanistan 20,249 1950
## 2   ALB     Albania  8,097 1950
## 3   AFG Afghanistan 21,352 1951
## 4   ALB     Albania  8,986 1951
## 5   AFG Afghanistan 22,532 1952
## 6   ALB     Albania 10,058 1952
## 7   AFG Afghanistan 23,557 1953
## 8   ALB     Albania 11,123 1953
## 9   AFG Afghanistan 24,555 1954
## 10  ALB     Albania 12,246 1954