在字符串中查找连续1的最大数量?

时间:2013-08-01 20:59:40

标签: r

有没有简单的方法可以在字符串中获得连续1的最大数量,如: "000010011100011111001111111100"

我当然可以用循环来做,但我想避免这种情况,因为我的实际数据集有大约500,000条记录。

提前感谢您的帮助。

3 个答案:

答案 0 :(得分:7)

使用rle比使用正则表达式更慢,更笨拙。在Thomas' answer中,当值等于1时,您仍然需要提取最大长度。

# make some data
set.seed(21)
N <- 1e5
s <- sample(c("0","1"), N*30, TRUE)
s <- split(s, rep(1:N, each=30))
s <- sapply(s, paste, collapse="")
# Thomas' (complete) answer
r <- function(S) {
  sapply(S, function(x) {
    rl <- rle(as.numeric(strsplit(x,"")[[1]]))
    max(rl$lengths[rl$values==1])
  })
}
# using regular expressions
g <- function(S) sapply(gregexpr("1*",S),
   function(x) max(attr(x,'match.length')))
# timing
system.time(R <- r(s))
#    user  system elapsed 
#    6.41    0.00    6.41
system.time(G <- g(s))
#    user  system elapsed 
#    1.47    0.00    1.46
all.equal(R,G)
# [1] "names for target but not for current"

答案 1 :(得分:6)

另一种快得多的方式,而不使用rle 将分为连续的0,如下所示:

# following thelatemail's comment, changed '0+' to '[^1]+'
strsplit(x, "[^1]+", perl=TRUE)

然后,您可以遍历并获取列表中每个元素的最大字符数。这也比rle解决方案更快。并且比@Joshua的gregexpr解决方案更快。一些基准......

zz <- function(x) {
    vapply(strsplit(x, "[^1]+", perl=TRUE), function(x) max(nchar(x)), 0L)
}

我刚刚意识到@ Joshua的功能也可以通过添加perl=TRUE和使用vapply进行调整。所以,我也会比较一下。

g2 <- function(S) vapply(gregexpr("1*",S, perl=TRUE),
   function(x) max(attr(x,'match.length')), 0L)

require(microbenchmark)
microbenchmark(t1 <- zz(unname(s)), t2 <- g(unname(s)), t3 <- g2(unname(s)), times=50)
Unit: seconds
                expr      min       lq   median       uq      max neval
 t1 <- zz(unname(s)) 1.187197 1.285065 1.344371 1.497564 1.565481    50
  t2 <- g(unname(s)) 2.154038 2.307953 2.357789 2.417259 2.596787    50
 t3 <- g2(unname(s)) 1.562661 1.854143 1.914597 1.954795 2.203543    50

identical(t1, t2) # [1] TRUE
identical(t1, t3) # [1] TRUE

答案 2 :(得分:4)

使用rle

x <- "000010011100011111001111111100"
rr <- rle(strsplit(x,"")[[1]])

Run Length Encoding
  lengths: int [1:9] 4 1 2 3 3 5 2 8 2
  values : chr [1:9] "0" "1" "0" "1" "0" "1" "0" "1" "0"

注意:我删除了as.numeric部分,因为没有必要。从这里开始,你可以得到连续1的最大数量:

max(rr$lengths[which(rr$values == "1")])
# [1] 8