如何在R中平均每两行数据帧

时间:2019-05-02 19:48:57

标签: r dataframe

我有以下数据框(具有1000列):

df<- structure(c(1, 2, 2, 1, 2, 2, 2, 1, 3, 3, 2, 2), 
              .Dim = 4:3, .Dimnames = list(c("a", "b", "c", "d"), 
               c("t1", "t2", "t3")))

什么是获取每两行平均值的有效方法?

我想要的结果:

     t1 t2 t3
a    1  2  3
b    2  2  3
a_b  1.5 2 3
c    2  2  2
d    1  1  2
c_d  1.5 1.5 2

6 个答案:

答案 0 :(得分:4)

每隔2行拆分一次,然后每列求平均值,然后rbind,然后再次rbind。

do.call(rbind,
        lapply(seq(1, nrow(df), 2), function(i){
          x <- df[ i:(i + 1), , drop = FALSE]
          res <- rbind(x, colSums(x)/2)
          rownames(res)[ nrow(res) ] <- paste(rownames(x), collapse = "_")
          res
        }))

#      t1  t2 t3
# a   1.0 2.0  3
# b   2.0 2.0  3
# a_b 1.5 2.0  3
# c   2.0 2.0  2
# d   1.0 1.0  2
# c_d 1.5 1.5  2

答案 1 :(得分:2)

一种dplyr可能是:

df %>%
 data.frame() %>%
 rownames_to_column() %>%
 mutate_if(is.factor, as.numeric) %>%
 group_by(group = gl(n()/2, 2)) %>%
 group_map(~ bind_rows(.x, tibble(rowname = paste(.x$rowname, collapse = "_"), 
                                  t1 = mean(.x$t1),
                                  t2 = mean(.x$t2),
                                  t3 = mean(.x$t3)))) %>%
 ungroup() %>%
 select(-group)

  rowname    t1    t2    t3
  <chr>   <dbl> <dbl> <dbl>
1 a         1     2       2
2 b         2     2       2
3 a_b       1.5   2       2
4 c         2     2       1
5 d         1     1       1
6 c_d       1.5   1.5     1

如果您事先将其创建为data.frame,并且名称是一列,因子是数字变量,则可以省略前三行。然后,它首先要做的是使用gl()创建一个分组变量。其次,它计算均值,将名称创建为组中两个元素的组合,并将其与原始数据绑定。最后,它取消分组并删除冗余变量。

答案 2 :(得分:1)

另一种dplyr方法。
更新:如果您确实需要行名(aba_b等),请参阅我的原始解决方案,以获取可扩展但更复杂的信息,版本。

原始

df <- df %>% as_tibble()
n <- nrow(df)/2
orig <- df %>% mutate(grp = sort(rep(1:2, n)))
means <- orig %>% group_by(grp) %>% summarise_all(mean)

bind_rows(orig, means) %>% arrange(grp) %>% select(-grp)

输出:

# A tibble: 6 x 3
     t1    t2    t3
  <dbl> <dbl> <dbl>
1   1     2       3
2   2     2       3
3   1.5   2       3
4   2     2       2
5   1     1       2
6   1.5   1.5     2

已更新为行名

rnames <- row.names(df)
df <- df %>% as_tibble() 

n <- (nrow(df)/2)

orig <- df %>% 
  mutate(grp = sort(rep(1:n, n)), rn = rnames)

means <- orig %>% 
  group_by(grp) %>% 
  mutate(rn = paste0(rn, collapse="_")) %>%
  ungroup() %>%
  group_by(rn) %>%
  summarise_if(is.numeric, mean)

bind_rows(orig, means) %>% arrange(grp) %>% select(-grp)

输出:

     t1    t2    t3 rn   
  <dbl> <dbl> <dbl> <chr>
1   1     2       3 a    
2   2     2       3 b    
3   1.5   2       3 a_b  
4   2     2       2 c    
5   1     1       2 d    
6   1.5   1.5     2 c_d  

答案 3 :(得分:1)

适用于任意数量列的base R解决方案

M <- matrix(unlist(c(df)), ncol = 2, byrow = TRUE)
M <- cbind(M, rowMeans(M))
M <- matrix(c(t(M)),ncol = ncol(df), byrow = FALSE)

# add row names and column names 
row.names <- matrix(rownames(df), ncol = 2 ,byrow = TRUE)
rownames(M) <- c(t(cbind(row.names, apply(row.names,1, paste, collapse = "_"))))
colnames(M) <- colnames(df)


#        t1   t2   t3
#  a    1.0  2.0    3
#  b    2.0  2.0    3
#  a_b  1.5  2.0    3
#  c    2.0  2.0    2
#  d    1.0  1.0    2
#  c_d  1.5  1.5    2

答案 4 :(得分:0)

一种可能性是使用dplyr软件包。 请注意,我使用的数据与您使用的数据略有不同:数据中的数字实际上是字符值。

df <- structure(c(1, 2, 2, 1, 2, 2, 2, 1, 3, 3, 2, 2), 
               .Dim = 4:3, .Dimnames = list(c("a", "b", "c", "d"), 
                                            c("t1", "t2", "t3")))

首先,我创建摘要小标题(其中包含均值)。

    library(dplyr)
    df_summary <- df %>% as_tibble(rownames = "names") %>% 
      group_by(ceiling(1:n() / 2)) %>% 
      summarise(names = paste(names, collapse = "_"),
                t1 = mean(t1),
                t2 = mean(t2),
                t3 = mean(t3)) %>% 
      select(-1)
    # A tibble: 2 x 4
      names    t1    t2    t3
      <chr> <dbl> <dbl> <dbl>
    1 a_b     1.5   2       3
    2 c_d     1.5   1.5     2

然后我将摘要数据与原始数据结合起来

 df_summary %>% bind_rows(df %>% as_tibble(rownames = "names")) %>% 
  slice(3, 4, 1, 5, 6, 2)
# A tibble: 6 x 4
  names    t1    t2    t3
  <chr> <dbl> <dbl> <dbl>
1 a       1     2       3
2 b       2     2       3
3 a_b     1.5   2       3
4 c       2     2       2
5 d       1     1       2
6 c_d     1.5   1.5     2

答案 5 :(得分:0)

您可以使用data.table来做到这一点:

library(data.table)
as.data.table(df)[, lapply(.SD, mean), by= (seq(nrow(df)) - 1) %/% 2]
#    seq  t1  t2 t3
# 1:   0 1.5 2.0  3
# 2:   1 1.5 1.5  2