Entering edit mode
I'm running a crisprseek to get gRNA for nmecas9. I'm expecting 24 nt output and 6 from my PAM sequence. Below is an iteration that works. However, when I modify the gRNA.size to be 24, I get a weight error. When I change the weight commant to rep(1,24), the error changes to a column error. I am stuck.
library(CRISPRseek)
library(BSgenome.Mmusculus.UCSC.mm10)
library(TxDb.Mmusculus.UCSC.mm10.knownGene)
library(org.Mm.eg.db)
res <- offTargetAnalysis(
inputFilePath = "classified, snooper!",
format = c("fasta", "fastq", "bed"),
header = FALSE,
gRNAoutputName = "p47_mouse_NNNNCC",
findgRNAs = TRUE,
exportAllgRNAs = c("all", "fasta", "genbank", "no"),
findgRNAsWithREcutOnly = FALSE,
REpatternFile = REpatternFile_default(),
minREpatternSize = 4,
overlap.gRNA.positions = c(17, 18),
findPairedgRNAOnly = FALSE,
annotatePaired = TRUE,
paired.orientation = c("PAMout", "PAMin"),
enable.multicore = FALSE,
n.cores.max = 6,
min.gap = 0,
max.gap = 20,
gRNA.name.prefix = NULL,
gRNA.size = 20,
PAM = "NNNNCC",
PAM.size = 6,
PAM.pattern = "NNNNCN",
BSgenomeName = BSgenome.Mmusculus.UCSC.mm10,
genomeSeqFile = NULL,
chromToSearch = "all",
chromToExclude = chromToExclude_default,
max.mismatch = 3,
allowed.mismatch.PAM = 1,
gRNA.pattern = NULL,
baseEditing = FALSE,
targetBase = "C",
editingWindow = 4:8,
editingWindow.offtargets = 4:8,
primeEditing = FALSE,
PBS.length = 13L,
RT.template.length = 8:28,
RT.template.pattern = "D$",
corrected.seq = NULL,
targeted.seq.length.change = NULL,
bp.after.target.end = 15L,
target.start = NULL,
target.end = NULL,
primeEditingPaired.output = "pairedgRNAsForPE.xls",
min.score = 0,
topN = 1000,
topN.OfftargetTotalScore = 10,
annotateExon = TRUE,
txdb = TxDb.Mmusculus.UCSC.mm10.knownGene,
orgAnn = org.Mm.eg.db,
ignore.strand = TRUE,
outputDir = "also classified ya snoop!",
fetchSequence = TRUE,
upstream = 200,
downstream = 200,
weights = weights_default,
baseBeforegRNA = 4,
baseAfterPAM = 3,
featureWeightMatrixFile = featureWeightMatrixFile_default(),
useScore = TRUE,
useEfficacyFromInputSeq = FALSE,
outputUniqueREs = TRUE,
foldgRNAs = FALSE,
gRNA.backbone = gRNA.backbone_default,
temperature = 37,
overwrite = FALSE,
scoring.method = c("Hsu-Zhang", "CFDscore"),
subPAM.activity = subPAM.activity_default,
subPAM.position = c(22, 23),
PAM.location = "3prime",
rule.set = c("Root_RuleSet1_2014", "Root_RuleSet2_2016", "CRISPRscan", "DeepCpf1"),
chrom_acc = NULL,
calculategRNAefficacyForOfftargets = TRUE,
mismatch.activity.file = mismatch.activity.file_default(),
predIndelFreq = FALSE,
predictIndelFreq.onTargetOnly = TRUE,
method.indelFreq = "Lindel",
baseBeforegRNA.indelFreq = 13,
baseAfterPAM.indelFreq = 24,
findOffTargetsWithBulge = FALSE,
method.findOffTargetsWithBulge = c("CasOFFinder_v3.0.0b3"),
DNA_bulge = 2,
RNA_bulge = 2
)
