更快的方法来比较数据框中的行

时间:2013-11-01 03:49:41

标签: r

考虑下面的数据框。我希望将每行与下面的行进行比较,然后获取超过3个值的相等行。

我编写了下面的代码,但是如果你有一个大数据框,它会非常慢。

我怎么能更快地做到这一点?

data <- as.data.frame(matrix(c(10,11,10,13,9,10,11,10,14,9,10,10,8,12,9,10,11,10,13,9,13,13,10,13,9), nrow=5, byrow=T))
rownames(data)<-c("sample_1","sample_2","sample_3","sample_4","sample_5")

>data
          V1 V2 V3 V4 V5
sample_1  10 11 10 13  9
sample_2  10 11 10 14  9
sample_3  10 10  8 12  9
sample_4  10 11 10 13  9
sample_5  13 13 10 13  9

output <- data.frame(sample = NA, duplicate = NA, matches = NA)
dfrow <- 1
for(i in 1:nrow(data)) {
    sample <- data[i, ]
    for(j in (i+1):nrow(data)) if(i+1 <= nrow(data)) {
    matches <- 0
        for(V in 1:ncol(data)) {
            if(data[j,V] == sample[,V]) {       
                matches <- matches + 1
            }
        }
        if(matches > 3) {
            duplicate <- data[j, ]
            pair <- cbind(rownames(sample), rownames(duplicate), matches)
            output[dfrow, ] <- pair
            dfrow <- dfrow + 1
        }
    }
}

>output
   sample    duplicate    matches
1 sample_1   sample_2     4
2 sample_1   sample_4     5
3 sample_2   sample_4     4

7 个答案:

答案 0 :(得分:9)

这是一个Rcpp解决方案。但是,如果结果矩阵太大(即命中次数过多),则会产生错误。我运行循环两次,首先得到结果矩阵的必要大小,然后填充它。可能有更好的可能性。而且,显然,这只适用于整数。如果矩阵是数字的,则必须处理浮点精度。

library(Rcpp)
library(inline)

#C++ code:
body <- '
const IntegerMatrix        M(as<IntegerMatrix>(MM));
const int                  m=M.ncol(), n=M.nrow();
long                        count1;
int                         count2;
count1 = 0;
for (int i=0; i<(n-1); i++)
{
   for (int j=(i+1); j<n; j++)
   {
     count2 = 0;
     for (int k=0; k<m; k++) {
        if (M(i,k)==M(j,k)) count2++;
     }
     if (count2>3) count1++;
   } 
}
IntegerMatrix              R(count1,3);
count1 = 0;
for (int i=0; i<(n-1); i++)
{
   for (int j=(i+1); j<n; j++)
   {
     count2 = 0;
     for (int k=0; k<m; k++) {
        if (M(i,k)==M(j,k)) count2++;
     }
     if (count2>3) {
        count1++;
        R(count1-1,0) = i+1;
        R(count1-1,1) = j+1;
        R(count1-1,2) = count2;
     }
   } 
}
return  wrap(R);
'

fun <- cxxfunction(signature(MM = "matrix"), 
                     body,plugin="Rcpp")

#with your data
fun(as.matrix(data))
#      [,1] [,2] [,3]
# [1,]    1    2    4
# [2,]    1    4    5
# [3,]    2    4    4

#Benchmarks
set.seed(42)
mat1 <- matrix(sample(1:10,250*26,TRUE),ncol=26)
mat2 <- matrix(sample(1:10,2500*26,TRUE),ncol=26)
mat3 <- matrix(sample(1:10,10000*26,TRUE),ncol=26)
mat4 <- matrix(sample(1:10,25000*26,TRUE),ncol=26)
library(microbenchmark)
microbenchmark(
  fun(mat1),
  fun(mat2),
  fun(mat3),
  fun(mat4),
  times=3
  )
# Unit: milliseconds
#      expr          min           lq       median           uq          max neval
# fun(mat1)     2.675568     2.689586     2.703603     2.732487     2.761371     3
# fun(mat2)   272.600480   274.680815   276.761151   276.796217   276.831282     3
# fun(mat3)  4623.875203  4643.634249  4663.393296  4708.067638  4752.741979     3
# fun(mat4) 29041.878164 29047.151348 29052.424532 29235.839275 29419.254017     3

答案 1 :(得分:3)

编辑:不知道我昨晚在减去行时的想法,因为我可以直接测试相等性。从下面的代码中删除了那段不必要的步骤。

这是一种可能略显聪明或思路不佳的方法......但希望是前者。我们的想法是,不是逐行进行一系列比较,而是通过从数据帧的其余部分中减去行,然后查看等于零的元素数来执行某些向量化操作。以下是该方法的简单实现:

> library(data.table)
> data <- as.data.frame(matrix(c(10,11,10,13,9,10,11,10,14,9,10,10,8,12,9,10,11,10,13,9,13,13,10,13,9), nrow=5, byrow=T))
> rownames(data)<-c("sample_1","sample_2","sample_3","sample_4","sample_5")
> 
> findMatch <- function(i,n){
+   tmp <- colSums(t(data[-(1:i),]) == unlist(data[i,]))
+   tmp <- tmp[tmp > n]
+   if(length(tmp) > 0) return(data.table(sample=rownames(data)[i],duplicate=names(tmp),match=tmp))
+   return(NULL)
+ }
> 
> system.time(tab <- rbindlist(lapply(1:(nrow(data)-1),findMatch,n=3)))
   user  system elapsed 
  0.003   0.000   0.003 
> tab
     sample duplicate match
1: sample_1  sample_2     4
2: sample_1  sample_4     5
3: sample_2  sample_4     4

编辑:这是版本2,它使用矩阵并对数据进行预转置,因此您只需要执行一次。它应该使用非平凡的数据量更好地扩展到您的示例。

library(data.table)
data <- matrix(round(runif(26*250000,0,25)),ncol=26)
tdata <- t(data)

findMatch <- function(i,n){
    tmp <- colSums(tdata[,-(1:i)] == data[i,])
    j <- which(tmp > n)
    if(length(tmp) > 0) return(data.table(sample=i,duplicate=j+1,match=tmp[j]))
    return(NULL)
}

tab <- rbindlist(lapply(1:(nrow(data)-1),findMatch,n=3))

我在机器上运行了一段时间,并在15分钟内完成了前1500次迭代,完整的250,000 x 26矩阵,并且需要600 Mb内存。由于之前的迭代不会影响未来的迭代,因此您可以将其分成几部分,并在需要时单独运行。

答案 2 :(得分:2)

这不是一个完整的答案,只需要记住一个快速的训练是使用矩阵而不是data.frame(这些都很慢)。 R中的矩阵非常快,并且通过在其中完成至少一些操作,然后附加具有列名称的向量将导致显着的速度增加。

快速演示:

data <- matrix(c(10,11,10,13,9,10,11,10,14,9,10,10,8,12,9,10,11,10,13,9,13,13,10,13,9), nrow=5, byrow=T)rownames(data)<-c("sample_1","sample_2","sample_3","sample_4","sample_5")
mu<-c("sample_1","sample_2","sample_3","sample_4","sample_5")

t=proc.time()
tab <- data.frame(sample = NA, duplicate = NA, matches = NA)
dfrow <- 1
for(i in 1:nrow(data)) {
    sample <- data[i, ]
    for(j in (i+1):nrow(data)) if(i+1 <= nrow(data)) {
    matches <- 0
        for(V in 1:ncol(data)) {
            if(data[j,V] == sample[V]) {       
                matches <- matches + 1
            }
        }
        if(matches > 3) {
            duplicate <- data[j, ]
            pair <- cbind(mu[i], mu[j], matches)
            tab[dfrow, ] <- pair
            dfrow <- dfrow + 1
        }
    }
}
proc.time()-t

平均而言,在我的机器上,产量

   user  system elapsed 
   0.00    0.06    0.06 

在你的情况下,我得到了

 user  system elapsed 
   0.02    0.06    0.08 

我不确定是否有比矩阵更快的东西。您也可以使用并行化,但对于循环C++,经常使用代码内联(包Rcpp)。

答案 3 :(得分:2)

library(data.table)

#creating the data
dt <- data.table(read.table(textConnection(
"Sample          V1 V2 V3 V4 V5
sample_1  10 11 10 13  9
sample_2  10 11 10 14  9
sample_3  10 10  8 12  9
sample_4  10 11 10 13  9
sample_5  13 13 10 13  9"), header= TRUE))

# some constants which will be used frequently
nr = nrow(dt)
nc = ncol(dt)-1

#list into which we will insert the no. of matches for each sample 
#for example's sake, i still suggest you write output to a file possibly
totalmatches <- vector(mode = "list", length = (nr-1))

#looping over each sample
for ( i in 1:(nr-1))
{
   # all combinations of i with i+1 to nr
   samplematch <- cbind(dt[i],dt[(i+1):nr])

   # renaming the comparison sample columns
   setnames(samplematch,append(colnames(dt),paste0(colnames(dt),"2")))

   #calculating number of matches
   samplematch[,noofmatches := 0]
   for (j in 1:nc)
   {
      samplematch[,noofmatches := noofmatches+1*(get(paste0("V",j)) == get(paste0("V",j,"2")))]
   }

   # removing individual value columns and matches < 3
   samplematch <- samplematch[noofmatches >= 3,list(Sample,Sample2,noofmatches)]

   # adding to the list
   totalmatches[[i]] <- samplematch
}

输出 -

rbindlist(totalmatches)
     Sample  Sample2 noofmatches
1: sample_1 sample_2           4
2: sample_1 sample_4           5
3: sample_1 sample_5           3
4: sample_2 sample_4           4
5: sample_4 sample_5           3

矩阵的性能似乎更好,但这种方法是时钟 -

   user  system elapsed 
   0.17    0.01    0.19 

答案 4 :(得分:0)

评论中所说的一切都是非常有效的;特别是,我也不一定认为R是最好的地方。也就是说,对于我来说,这比你在一个更大的数据集上提出的要快得多(约为9.7秒,两分钟后未完成):

data <- matrix(sample(1:30, 10000, replace=TRUE), ncol=5)
#Pre-prepare
x <- 1
#Loop
for(i in seq(nrow(data)-2)){
  #Find the number of matches on that row
  sums <- apply(data[seq(from=-1,to=-i),], 1, function(x) sum(x==data[i,]))
  #Find how many are greater than/equal to 3
  matches <- which(sums >= 3)
  #Prepare output
  output[seq(from=x, length.out=length(matches)),1] <- rep(i, length(matches))
  output[seq(from=x, length.out=length(matches)),2] <- matches
  output[seq(from=x, length.out=length(matches)),3] <- sums[matches]
  #Alter the counter of how many we've made...
  x <- x + length(matches)
}
#Cleanup output
output <- output[!is.na(output[,1]),]})

...我非常肯定我的奇怪的x变量,output的分配可以改进/变成apply类型的问题,但现在已经很晚了,我累了!祝你好运!

答案 5 :(得分:0)

好吧,我抓了它,下面的代码运行速度比原来快3倍。

f <- function(ind, mydf){
    res <- NULL
    matches <- colSums(t(mydf[-(1:ind),])==mydf[ind,])
    Ndups <- sum(matches > 3)
    if(Ndups > 0){
        res <- data.frame(sample=rep(ind,Ndups),duplicate=which(matches > 3), 
                      matches= matches[matches > 3],stringsAsFactors = F)
        rownames(res) <- NULL
        return(as.matrix(res))
    }
    return(res)
}


f(1,mydf=as.matrix(data))
f(2,mydf=as.matrix(data))
system.time( 
for(i in 1:1000){
    tab <- NULL
    for(j in 1:(dim(data)[1]-1))
        tab <- rbind(tab,f(j,mydf=as.matrix(data)))
}
)/1000
tab 

答案 6 :(得分:0)

假设数据集中的所有条目具有相同的模式(数字),请将其转换为矩阵。通过转置,您可以利用==的矢量化方式。

data <- as.matrix(data)
data <- t(data)

output <- lapply(seq_len(ncol(data) - 1), function(x) {
    tmp <- data[,x] == data[, (x+1):ncol(data)]
    n_matches <- {
        if (x == ncol(data) - 1) {
            setNames(sum(tmp),colnames(data)[ncol(data)])
        } else {
            colSums(tmp)
        }
    }
    good_matches <- n_matches[n_matches >= 3]
})

最大的问题是如何输出结果。按照目前的情况,我将您的数据放在列表中。我认为这是存储数据的内存最少的方式。

[[1]]
sample_2 sample_4 sample_5 
       4        5        3 

[[2]]
sample_4 
       4 

[[3]]
named numeric(0)

[[4]]
sample_5 
       3 

如果您想要数据框输出,那么您需要在lapply内调整函数的返回值。也许在函数的最后一行添加:

return(data.frame(
    sample = colnames(data)[x], 
    duplicate = names(good_matches), 
    noofmatches = good_matches,
    stringsAsFactors = FALSE))

然后使用:

newoutput <- do.call(rbind, output)
## or, using plyr
# require(plyr)
# newoutput <- rbind.fill(output)