R/breakSeekr.R

Defines functions breakSeekr

Documented in breakSeekr

#' Find breakpoints from deltaWs
#'
#' Find breakpoints from deltaWs by localizing significant peaks based on z-score calculation.
#'
#' @param deltaWs A \code{\link{GRanges-class}} object with metadata column "deltaW" generated by \code{\link{deltaWCalculator}}.
#' @param trim The amount of outliers in deltaWs removed to calculate the stdev (10 will remove top 10\% and bottom 10\% of deltaWs).
#' @param peakTh The treshold that the peak deltaWs must pass to be considered a breakpoint (e.g. 0.33 is 1/3 of max(deltaW)).
#' @param zlim The number of stdev that the deltaW must pass the peakTh (ensures only significantly higher peaks are considered).
#' @return A \code{\link{GRanges-class}} object containing breakpoint coordinates with various metadata columns.
#' @author David Porubsky, Aaron Taudt, Ashley Sanders
#' @export
#' @examples
#'## Get an example file 
#'exampleFolder <- system.file("extdata", "example_bams", package="breakpointRdata")
#'exampleFile <- list.files(exampleFolder, full.names=TRUE)[1]
#'## Load the file
#'fragments <- readBamFileAsGRanges(exampleFile, pairedEndReads=FALSE, chromosomes='chr22')
#'## Calculate deltaW values
#'dw <- deltaWCalculator(fragments)
#'## Get significant peaks in deltaW values
#'breaks <- breakSeekr(dw)
#'
breakSeekr <- function(deltaWs, trim=10, peakTh=0.33, zlim=3.291) {
 
    if (length(deltaWs)==0) {
        message("No windows here.")
        return()
    }
    deltaW <- deltaWs$deltaW
    th <- max(deltaW)*peakTh # calculates the fraction (e.g. 0.33) of the highest deltaW > this will be the th
  
# group the breakpoints to refine at the peak of the peak:
#  if (mean(deltaW,na.rm=TRUE) <= 1) { # if mean is so low than there is no peak, skip library
#    message('no peaks here!')
#    return()
#  }
    # trims the outer 5% limit of the deltaWs to calulate the stdev
    trimVs <- deltaWs[quantile(deltaW, (trim/100) ) < deltaW & deltaW < quantile(deltaW, ((100-trim)/100) )]$deltaW
    if (length(trimVs) <= 1) {
        trimVs <- c(0,0,0)
    }
  
    # calculate zscores, which determine if deltaW is significantly ABOVE the sd
    if (sd(trimVs) == 0){ 
        zscores <- (deltaW - th) / sd(deltaW) 
    } else {
        zscores <- (deltaW - th) / sd(trimVs)
    }  
  
    ## Coerce zscore == NaN to 0
    zscores[is.nan(zscores)] <- 0
  
    ## Make peak list
    mask <- zscores > zlim
    rlemask <- rle(mask)
    rlegroup <- rlemask
    rlemaskT <- rlemask$values==TRUE
    rlegroup$values[rlemaskT] <- cumsum(rlemask$values[rlemaskT])
    deltaWs$peakGroup <- inverse.rle(rlegroup)

    ### refine breakpoints of the grouped peaks in the peakList
    breaks.unrefined <- deltaWs[deltaWs$peakGroup>0]
    peak.lengths <- list()
    breaks <- GenomicRanges::GRangesList()
    for (group in unique(breaks.unrefined$peakGroup)) {
        peak <- breaks.unrefined[breaks.unrefined$peakGroup == group]
        if (length(peak) > 1){ # ensures peak has more than 1 window above the threshold
            maxpeakdeltaW <- max(peak$deltaW)
            breaks[[as.character(group)]] <- peak[peak$deltaW == max(peak$deltaW)]
            peak.lengths[[as.character(group)]] <- rep(length(peak),length(breaks[[as.character(group)]]))
        }
    }
    breaks <- unlist(breaks)
    breaks$windows <- unlist(peak.lengths)
    if (length(breaks)>0) {
        return(breaks)
    } else {
        message('no peaks here!')
    }

    # simple plot, if desired
    # plot(deltaWs[,1], deltaWs[,3], type="l")
    # lines(peakList[,1], peakList[,3], col='red')
}
    
daewoooo/breakpointR documentation built on April 20, 2023, 4:13 p.m.