查找并重复运行

时间:2015-10-15 18:14:50

标签: r

我有一个带有重复模式的向量。我想打破n长度的重复模式改变的任何地方。 这是数据:

x <- c(rep(1:4, 5), rep(5:6, 3), rep(c(1, 4, 7), 5), rep(c(1, 5, 7), 1), rep(2:4, 3))

##  [1] 1 2 3 4 1 2 3 4 1 2 3 4 1 2 3 4 1 2 3 4 5 6 5 6 5 6 1 4 7 1 4 7 1 4 7 1 4 7 1 4 7 1 5 7 2 3 4 2 3 4 2 3 4

我希望能够找到模式发生变化的地方,以便它像这样打破:

enter image description here

我认为rle可能有用但却看不清楚。

3 个答案:

答案 0 :(得分:13)

这是一个功能。顺便说一下,这是遗传学中的一个问题 - 找到串联重复序列。 Here's a link to an algorithm paper这是一个比这更好的治疗,但实施起来要复杂得多。

输出是要将x拆分为的组的向量。

首先是辅助函数:

factorise <- function(x) {
  x <- length(x)
  if(x == 1){return(1)}
  todivide <- seq(from = 2, to = x)
  out <- todivide[x %% todivide == 0L]
  return(out)
}

现在主要功能:

findreps <- function(x, counter = NULL){
  if(is.null(counter)){
    counter <- c()
    maxcounter <- 0
  } else {
    maxcounter <- max(counter)
  }
  holding <- lapply(1:length(x), function(y){x[1:y]})
  factors <- lapply(holding, factorise)
  repeats <- sapply(1:length(factors), function(index) {any(sapply(1:length(factors[[index]]), function(zz) {all((rep(holding[[index]][1:(length(holding[[index]])/factors[[index]][zz])], factors[[index]][zz]))==holding[[index]])}))})
  holding <- holding[max(which(repeats))][[1]]
  if(length(holding) == length(x)){
    return(c(counter, rep(maxcounter + 1, length(x))))
  } else {
    counter <- c(counter, rep(maxcounter + 1, length(holding)))
    return(findreps(x[(length(holding) + 1):length(x)], counter))
  }
}

工作原理: 它是一个运行的递归函数,切断了它可以从向量的开头找到的最大重复组,然后运行直到它们全部消失。

首先我们为最终输出设置counter

接下来,我们将x分为从1开始的每个子集到列表holding

然后我们找到一组的大小的所有因素,除了1.

然后是最糟糕的部分。我们采用最大子集的每个子集,并在重复合理的次数后检查它是否等于其组中的最大子集。

findreps(x)
 [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 2 2 2 2 2 2 3 3 3 3 3 3 3 3 3 3
[37] 3 3 3 3 3 4 5 6 7 7 7 7 7 7 7 7 7

如果您希望对非重复进行分组,我们可以使用一点dplyrtidyr

library(dplyr)
library(tidyr)

z <- data.frame(x = x, y = findreps(x))

z %>% mutate(y = ifelse(duplicated(y) | rev(duplicated(rev(y))), y, NA),
             holding = c(0, y[2:n()])) %>%
      fill(holding) %>%
      mutate(y = ifelse(is.na(y), holding +1, y)) %>%
      select(-holding)

给出了:

 [1] 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 1 2 2 2 2 2 2 3 3 3 3 3 3 3 3 3 3 3 3 3 3 3 4 4 4 7 7 7 7 7 7 7 7
[53] 7

答案 1 :(得分:3)

我几乎在那里,但我没有完全100%的工作而且它已经迟到了(zzz)。首先是代码:

x <-c(rep(1:4, 5), rep(5:6, 3), rep(c(1, 4, 7), 5), rep(c(1, 5, 7), 1), rep(2:4, 3))

#The first break must be position 1
Xbreaklist <- 1

#We need a counter, a duplicate dataset 
counter <- 0
xx <- x

while (length(xx) > 0) {
#first we extract a pattern by looking for the first repeated number
Xpattern <- xx[1:(min(which(stri_duplicated(xx) == TRUE))-1)]

#then we convert the vector and the pattern into a string
XpatternS <- paste0(Xpattern, collapse="")
xxS <- paste0(xx, collapse="")

#then we extract all patterns and count them, multiply by length and add 1 
Xbreak <- 1 + (length(unlist(stri_extract_all_coll(xxS, XpatternS))) * length(Xpattern))

#break here if we reached the end 
if (Xbreak >= length(xx)) break

# We add that to the list of breaks
counter <- counter + Xbreak
Xbreaklist <- c(Xbreaklist, counter)

# then we remove the part of the list we're done with
xx <- xx[(Xbreak):length(xx)]
}

Xbreaklist
[1]  1 21 28 44 51

它出了什么问题?两件事:
1不重复的模式首次出现下一个模式:&#34; 121212 56 787878&#34;分裂为(&#34; 121212 5678 7878&#34;)
2重复模式(&#34; 1212 5656 12 134&#34;)搞砸了,因为stri_extract_all_coll将它们全部拿出来,因此长度很长。

答案 2 :(得分:2)

这是一个部分答案,但认为它比发表评论更好。它可能让其他人找到一种方法来做到这一点。

我的想法是将矢量分成大小为N的相等部分。然后检查连续的块是否与前一个块重复。我这样做的时间可能太长了 - 我确信必须有一种更简单的方法。

它似乎工作正常,可以形成另一种解决方法的基础。缺点是它无法获得仅发生一次的重复,例如&#34; 157&#34;

xx <- split(x, ceiling(seq_along(x)/N))  #split vector into equal chunks of size N
xx <- xx[-(length(xx))]  #get rid of uneven splitting of last vector

df <- do.call('rbind', xx) #bind together in a dataframe

results<-NULL  #loop to test if row is same as previous row (must be better way to do this)
for(i in 2:nrow(df)-1) {results[[i]] <- df[i,]==df[i+1,] }

results1 <- unlist(lapply(results, sum)) #count TRUEs in each result
results1[results1<N]<-0 #make all not equal to size of chunk (N) equal to zero

indices <- which(diff(results1)==-N)+1  #this is the first non-repeating group of N
indicesall <- (indices*N)+1 #to find location of next non-repeating id