129

我有一份员工名册,我需要知道他们最常在哪个部门工作。将员工 ID 与部门名称制成表格很简单,但从频率表中返回部门名称而不是花名册计数的数量则比较棘手。下面是一个简单的示例(列名 = 部门,行名 = 员工 ID)。

DF <- matrix(sample(1:9,9),ncol=3,nrow=3)
DF <- as.data.frame.matrix(DF)
> DF
  V1 V2 V3
1  2  7  9
2  8  3  6
3  1  5  4

现在我怎么得到

> DF2
  RE
1 V3
2 V1
3 V2
4

10 回答 10

128

使用您的数据的一种选择(以供将来参考,用于使用可重现set.seed()的示例):sample

DF <- data.frame(V1=c(2,8,1),V2=c(7,3,5),V3=c(9,6,4))

colnames(DF)[apply(DF,1,which.max)]
[1] "V3" "V1" "V2"

比使用更快的解决方案apply可能是max.col

colnames(DF)[max.col(DF,ties.method="first")]
#[1] "V3" "V1" "V2"

...哪里ties.method可以是任何"random" "first""last"

如果您碰巧有两列等于最大值,这当然会导致问题。我不确定在这种情况下您想做什么,因为某些行会有多个结果。例如:

DF <- data.frame(V1=c(2,8,1),V2=c(7,3,5),V3=c(7,6,4))
apply(DF,1,function(x) which(x==max(x)))

[[1]]
V2 V3 
 2  3 

[[2]]
V1 
 1 

[[3]]
V2 
 2 
于 2013-07-18T23:49:11.290 回答
16

如果您对data.table解决方案感兴趣,这里有一个。这有点棘手,因为您更喜欢获取第一个最大值的 id。如果您想要最后一个最大值,这会容易得多。不过,它并不复杂,而且速度很快!

在这里,我生成了您的尺寸数据 (26746 * 18)。

数据

set.seed(45)
DF <- data.frame(matrix(sample(10, 26746*18, TRUE), ncol=18))

data.table回答:

require(data.table)
DT <- data.table(value=unlist(DF, use.names=FALSE), 
            colid = 1:nrow(DF), rowid = rep(names(DF), each=nrow(DF)))
setkey(DT, colid, value)
t1 <- DT[J(unique(colid), DT[J(unique(colid)), value, mult="last"]), rowid, mult="first"]

基准测试:

# data.table solution
system.time({
DT <- data.table(value=unlist(DF, use.names=FALSE), 
            colid = 1:nrow(DF), rowid = rep(names(DF), each=nrow(DF)))
setkey(DT, colid, value)
t1 <- DT[J(unique(colid), DT[J(unique(colid)), value, mult="last"]), rowid, mult="first"]
})
#   user  system elapsed 
#  0.174   0.029   0.227 

# apply solution from @thelatemail
system.time(t2 <- colnames(DF)[apply(DF,1,which.max)])
#   user  system elapsed 
#  2.322   0.036   2.602 

identical(t1, t2)
# [1] TRUE

这些维度的数据大约快 11 倍,并且data.table扩展性也很好。


编辑:如果任何最大 id 都可以,那么:

DT <- data.table(value=unlist(DF, use.names=FALSE), 
            colid = 1:nrow(DF), rowid = rep(names(DF), each=nrow(DF)))
setkey(DT, colid, value)
t1 <- DT[J(unique(colid)), rowid, mult="last"]
于 2013-07-19T00:30:52.217 回答
16

一种解决方案可能是将日期从宽改为长,将所有部门放在一列中并在另一列中计数,按雇主 ID(在本例中为行号)分组,然后过滤到具有最大值。也有几个选项可以使用这种方法来处理关系。

library(tidyverse)

# sample data frame with a tie
df <- data_frame(V1=c(2,8,1),V2=c(7,3,5),V3=c(9,6,5))

# If you aren't worried about ties:  
df %>% 
  rownames_to_column('id') %>%  # creates an ID number
  gather(dept, cnt, V1:V3) %>% 
  group_by(id) %>% 
  slice(which.max(cnt)) 

# A tibble: 3 x 3
# Groups:   id [3]
  id    dept    cnt
  <chr> <chr> <dbl>
1 1     V3       9.
2 2     V1       8.
3 3     V2       5.


# If you're worried about keeping ties:
df %>% 
  rownames_to_column('id') %>%
  gather(dept, cnt, V1:V3) %>% 
  group_by(id) %>% 
  filter(cnt == max(cnt)) %>% # top_n(cnt, n = 1) also works
  arrange(id)

# A tibble: 4 x 3
# Groups:   id [3]
  id    dept    cnt
  <chr> <chr> <dbl>
1 1     V3       9.
2 2     V1       8.
3 3     V2       5.
4 3     V3       5.


# If you're worried about ties, but only want a certain department, you could use rank() and choose 'first' or 'last'
df %>% 
  rownames_to_column('id') %>%
  gather(dept, cnt, V1:V3) %>% 
  group_by(id) %>% 
  mutate(dept_rank  = rank(-cnt, ties.method = "first")) %>% # or 'last'
  filter(dept_rank == 1) %>% 
  select(-dept_rank) 

# A tibble: 3 x 3
# Groups:   id [3]
  id    dept    cnt
  <chr> <chr> <dbl>
1 2     V1       8.
2 3     V2       5.
3 1     V3       9.

# if you wanted to keep the original wide data frame
df %>% 
  rownames_to_column('id') %>%
  left_join(
    df %>% 
      rownames_to_column('id') %>%
      gather(max_dept, max_cnt, V1:V3) %>% 
      group_by(id) %>% 
      slice(which.max(max_cnt)), 
    by = 'id'
  )

# A tibble: 3 x 6
  id       V1    V2    V3 max_dept max_cnt
  <chr> <dbl> <dbl> <dbl> <chr>      <dbl>
1 1        2.    7.    9. V3            9.
2 2        8.    3.    6. V1            8.
3 3        1.    5.    5. V2            5.
于 2018-03-31T11:23:27.333 回答
15

基于上述建议,以下data.table解决方案对我来说工作得非常快:

library(data.table)

set.seed(45)
DT <- data.table(matrix(sample(10, 10^7, TRUE), ncol=10))

system.time(
  DT[, col_max := colnames(.SD)[max.col(.SD, ties.method = "first")]]
)
#>    user  system elapsed 
#>    0.15    0.06    0.21
DT[]
#>          V1 V2 V3 V4 V5 V6 V7 V8 V9 V10 col_max
#>       1:  7  4  1  2  3  7  6  6  6   1      V1
#>       2:  4  6  9 10  6  2  7  7  1   3      V4
#>       3:  3  4  9  8  9  9  8  8  6   7      V3
#>       4:  4  8  8  9  7  5  9  2  7   1      V4
#>       5:  4  3  9 10  2  7  9  6  6   9      V4
#>      ---                                       
#>  999996:  4  6 10  5  4  7  3  8  2   8      V3
#>  999997:  8  7  6  6  3 10  2  3 10   1      V6
#>  999998:  2  3  2  7  4  7  5  2  7   3      V4
#>  999999:  8 10  3  2  3  4  5  1  1   4      V2
#> 1000000: 10  4  2  6  6  2  8  4  7   4      V1

并且还具有可以始终.SD通过在中提及它们来指定应考虑哪些列的优点.SDcols

DT[, MAX2 := colnames(.SD)[max.col(.SD, ties.method="first")], .SDcols = c("V9", "V10")]

如果我们需要最小值的列名,正如@lwshang 所建议的那样,只需要使用-.SD

DT[, col_min := colnames(.SD)[max.col(-.SD, ties.method = "first")]]
于 2016-10-07T18:04:27.453 回答
10

一个dplyr解决方案:

主意:

  • 将 rowids 添加为列
  • 重塑为长格式
  • 过滤每组中的最大值

代码:

DF = data.frame(V1=c(2,8,1),V2=c(7,3,5),V3=c(9,6,4))
DF %>% 
  rownames_to_column() %>%
  gather(column, value, -rowname) %>%
  group_by(rowname) %>% 
  filter(rank(-value) == 1) 

结果:

# A tibble: 3 x 3
# Groups:   rowname [3]
  rowname column value
  <chr>   <chr>  <dbl>
1 2       V1         8
2 3       V2         5
3 1       V3         9

这种方法可以很容易地扩展以获得顶部n列。示例n=2

DF %>% 
  rownames_to_column() %>%
  gather(column, value, -rowname) %>%
  group_by(rowname) %>% 
  mutate(rk = rank(-value)) %>%
  filter(rk <= 2) %>% 
  arrange(rowname, rk) 

结果:

# A tibble: 6 x 4
# Groups:   rowname [3]
  rowname column value    rk
  <chr>   <chr>  <dbl> <dbl>
1 1       V3         9     1
2 1       V2         7     2
3 2       V1         8     1
4 2       V3         6     2
5 3       V2         5     1
6 3       V3         4     2
于 2018-11-06T14:31:22.207 回答
9

一种选择dplyr 1.0.0可能是:

DF %>%
 rowwise() %>%
 mutate(row_max = names(.)[which.max(c_across(everything()))])

     V1    V2    V3 row_max
  <dbl> <dbl> <dbl> <chr>  
1     2     7     9 V3     
2     8     3     6 V1     
3     1     5     4 V2     

pmap()在某些情况下,使用(requires )可能更安全purrr

DF %>%
    mutate(row_max = pmap(across(everything()), ~ names(c(...)[which.max(c(...))])))

样本数据:

DF <- structure(list(V1 = c(2, 8, 1), V2 = c(7, 3, 5), V3 = c(9, 6, 
4)), class = "data.frame", row.names = c(NA, -3L))
于 2020-08-17T19:54:56.297 回答
3

这是一个快速简单的 tidyverse 解决方案,可以轻松应用于data.frame. 如果所有列都为 0,则以下版本还用于ifelse添加缺失值。例如,如果有人想使用它来重新组合 one-hot 编码列,则缺失值将很有用。它适用于问题中的数据,但这里有一个它也适用的单热编码数据集的示例。

data <- data.frame(
   oh_a = c(1,0,0,1,0,0)
  ,oh_b = c(0,1,1,0,0,0)
  ,oh_c = c(0,0,0,0,1,0)
  ,d = c("l","m","n","o","p","q"))

f <- function(x){ifelse(rowSums(x)==0, NA, names(x)[max.col(x, "first")])}
data %>% 
  mutate(transformed = f(across(starts_with("oh"))))

输出:

  oh_a oh_b oh_c d transformed
1    1    0    0 l        oh_a
2    0    1    0 m        oh_b
3    0    1    0 n        oh_b
4    1    0    0 o        oh_a
5    0    0    1 p        oh_c
6    0    0    0 q        <NA>
于 2021-09-05T07:10:28.047 回答
2

一个简单的for循环也很方便:

> df<-data.frame(V1=c(2,8,1),V2=c(7,3,5),V3=c(9,6,4))
> df
  V1 V2 V3
1  2  7  9
2  8  3  6
3  1  5  4
> df2<-data.frame()
> for (i in 1:nrow(df)){
+   df2[i,1]<-colnames(df[which.max(df[i,])])
+ }
> df2
  V1
1 V3
2 V1
3 V2
于 2018-07-03T05:05:43.340 回答
0

这是一个适用于 data.table 并且更简单的答案。这假设您的 data.table 被命名为yourDF

j1 <- max.col(yourDF[, .(V1, V2, V3, V4)], "first")
yourDF$newCol <- c("V1", "V2", "V3", "V4")[j1]

用你的列名替换("V1", "V2", "V3", "V4")(V1, V2, V3, V4)

于 2019-03-18T17:30:47.460 回答
0

这个很快:

with(DF, {
  names(DF)[(V1 > V2 & V1 > V3) * 1 + (V2 > V3 & V2 > V1) * 2 + (V3 > V1 & V3 > V2)*3]
})
于 2021-04-14T18:38:57.810 回答