scoreAllWindows {motifbreakR}R Documentation

scoreMotif.a <- function(snp.seq, ppm, len, offset = 1) snp.seq <- snp.seq[offset:(offset + len - 1)] ## diag code position.probs <- c(ppm[snp.seq, ])[1L + 0L:(len - 1L) * (len + 1L)] return(position.probs) #' @importFrom compiler cmpfun scoreMotif <- cmpfun(scoreMotif.a, options = list(optimize = 3))

Description

scoreMotif.a <- function(snp.seq, ppm, len, offset = 1) snp.seq <- snp.seq[offset:(offset + len - 1)] ## diag code position.probs <- c(ppm[snp.seq, ])[1L + 0L:(len - 1L) * (len + 1L)] return(position.probs) #' @importFrom compiler cmpfun scoreMotif <- cmpfun(scoreMotif.a, options = list(optimize = 3))

Usage

scoreAllWindows(snp.seq, snp.seq.rc, pwm, from = "default",
  to = "default", pwm.range = NULL, calcp = TRUE)

[Package motifbreakR version 2.0.0 Index]