R:如何根据多个标准求和并总结表格

时间:2015-01-28 16:23:13

标签: r plyr dplyr

这是我的原始数据框:

df <- read.table(text="
  Date         Index  Event
  2014-03-31   A      x
  2014-03-31   A      x
  2014-03-31   A      y
  2014-04-01   A      y
  2014-04-01   A      x
  2014-04-01   B      x
  2014-04-02   B      x
  2014-04-03   A      x
  2014-09-30   B      x", header = T, stringsAsFactors = F)

date_range <- seq(as.Date(min(df$Date)), as.Date(max(df$Date)), 'days')
indices <- unique(df$Index)
events_table <- unique(df$Event)

我希望我想要的输出汇总我的数据框,并为 indices 中的每个索引和 date_range 中的每个日期创建一个唯一记录,同时提供每个事件的累积值在新列中的events_table 表示日期列中值之前的所有日期。有时每个索引或每个日期都没有记录。

这是我想要的输出:

Date        Index  cumsum(Event = x) cumsum(Event = y)
2014-03-31  A      0                 0
2014-03-31  B      0                 0
2014-04-01  A      2                 1
2014-04-01  B      0                 0
2014-04-02  A      3                 2
2014-04-02  B      1                 0
...  
2014-09-29  A      4                 2
2014-09-29  B      2                 0
2014-09-30  A      4                 2
2014-09-30  B      2                 0

仅供参考 - 这是数据框的简化版本。每年有大约200,000条记录,每个日期有数百个不同的索引字段。

我在过去使用byaggregate进行硬盘驱动之前已经这样做了,但过程非常缓慢,而且这次我无法解决这个问题。 。我也尝试了ddply,但我无法使用cumsum函数来处理它。使用ddply,我尝试了类似的内容:

ddply(xo1, .(Date,Index), summarise, 
      sum.x = sum(Event == 'x'), 
      sum.y = sum(Event == 'y'))

无济于事。
通过搜索,我发现Replicating an Excel SUMIFS formula 这让我成为我项目的累积部分,但有了这个,我无法弄清楚如何将它总结为每个日期/索引组合只有一个记录。我也遇到了sum/aggregate data based on dates, R,但在这里我无法计算动态日期方面。

感谢任何可以提供帮助的人!

2 个答案:

答案 0 :(得分:3)

library(dplyr)
library(tidyr)

df$Date <- as.Date(df$Date)

步骤1:生成{Date,Index}对的完整列表

full_dat <- expand.grid(
  Date = date_range, 
  Index = indices,
  stringsAsFactors = FALSE
  ) %>% 
  arrange(Date, Index) %>%
  tbl_df

第2步:定义忽略cumsum()

NA函数
cumsum2 <- function(x){

  x[is.na(x)] <- 0
  cumsum(x)

}

步骤3:按{Date,Index}生成总计,加入完整的{Date,Index}数据, 并计算滞后累积和。

df %>%
  group_by(Date, Index) %>%
  summarise(
    totx = sum(Event == "x"),
    toty = sum(Event == "y")
    ) %>%
  right_join(full_dat, by = c("Date", "Index")) %>% 
  group_by(Index) %>%
  mutate(
    cumx = lag(cumsum2(totx)),
    cumy = lag(cumsum2(toty))
    ) %>%
  # some clean up.
  select(-starts_with("tot")) %>%
  mutate(
    cumx = ifelse(is.na(cumx), 0, cumx),
    cumy = ifelse(is.na(cumy), 0, cumy)
    )

答案 1 :(得分:1)

使用dplyrtidyr会是这样吗?

library(dplyr)
library(tidyr)

df %>%
  group_by(Date, Index, Event) %>%
  summarise(events = n()) %>%
  group_by(Index, Event) %>%
  mutate(cumsum_events = cumsum(events)) %>%
  select(-events) %>%
  spread(Event, cumsum_events) %>%
  rename(sum.x = x,
         sum.y = y)

#        Date Index sum.x sum.y
#1 2014-03-31     A     2     1
#2 2014-04-01     A     3     2
#3 2014-04-01     B     1    NA
#4 2014-04-02     B     2    NA
#5 2014-04-03     A     4    NA
#6 2014-09-30     B     3    NA