I dont understand the following instructions in crisprseek attachment 8. I tried to follow when hit rock bottom.
outputDir <- getwd()
does that mean i type in (i)outputDir or (ii)getwd() or (iii)outputDir <- getwd() ? (i) when i type in outputdir, it givees me [1] "C:/Users/Jit Ming/Documents/doc 1
does that mean i have set the output directory?
inputFilePath <- "X.fa"
does that mean I type in "inputFilePath"?
> "inputFilePath"
[1] "inputFilePath"
or
> "MS1.fasta"
[1] "MS1.fasta"
REpatternFile <- system.file("extdata", "NEBenzymes.fa", package = "CRISPRseek")
I dont understand how REpatternFile is done too? can someone please help me with REpatternFIle and offtargetAnalysis? I do not knwo hwo you bring up inputfilepath, findgRNAswithREcutonly command ........
offTargetAnalysis(inputFilePath, findgRNAsWithREcutOnly = FALSE,
REpatternFile = REpatternFile, findPairedgRNAOnly = FALSE, BSgenomeName = Hsapiens, txdb = TxDb.Hsapiens.UCSC.hg19.knownGene, max.mismatch = 3, chromToSearch = "", outputDir = outputDir, overwrite = TRUE)
Sorry I am big time computer-illiterate.
> library(CRISPRseek)
> library("BSgenome.Hsapiens.UCSC.hg19")
> library(TxDb.Hsapiens.UCSC.hg19.knownGene)
> outputDir <- getwd()
> inputFilePath <- "MS1.fasta "
> REpatternFile <- system.file("extdata", "NEBenzymes.fa", package = "CRISPRseek")
> offTargetAnalysis (inputFilePath, format=“fasta”, findgRNAs=TRUE, exportAllgRNAs=c(“all”, “fasta”, “genbank”, “no”), findgRNAsWithREcutOnly=FALSE, REpatternFile, minREpatternSize=6, overlap.gRNA.positions=c(17, 18), findPairedgRNAOnly=FALSE, min.gap=0, max.gap=20, gRNA.name.prefix=“gRNA”, PAM.size=3, gRNA.size=20, PAM=“NGG”, BSgenomeName = Hsapiens, txdb = TxDb.Hsapiens.UCSC.hg19.knownGene, chromToSearch=“all”, max.mismatch=4, PAM.pattern=“N[A|G]G$”, gRNA.pattern=“”, min.score=0.5, topN=100, topN.OfftargetTotalScore=10, annotateExon=TRUE, txdb, outputDir, fetchSequence=TRUE, upstream=200, downstream=200, weights=c(0, 0, 0.014, 0, 0, 0.395, 0.317, 0, 0.389, 0.079, 0.445, 0.508, 0.613, 0.851, 0.732, 0.828, 0.615, 0.804, 0.685, 0.583), overwrite=FALSE)
Error: unexpected input in "offTargetAnalysis (inputFilePath, format=“"
I think the instructions meant that i have to copy and paste those lines into R programming. but i have an error in format. why is that? I use CLuter2X to convert MS1.txt to MS1.fasta file. what is wrong with this format?
I see this is your first post. Welcome to Bioconductor!
A few tips. Please post your question as a "Question" rather than as a "Tutorial" -- you're not offering a tutorial! Please tag your question with the name of package you want help with -- I've done that for you now. Please don't post answers to your own question -- use the "Add Comment" or "Add Reply" buttons instead. I've moved your answer to a comment, leaving the answer space free for real answers.
Hi Gordon,
Thank you for those tips.
I saw some previous posts and noticed people were using .fa rather than .fasta file. So I changed my MS1.fasta to MS1.fa. It seems that it has gone away. But I have new problems.
> library(CRISPRseek)
> library("BSgenome.Hsapiens.UCSC.hg19")
> library(TxDb.Hsapiens.UCSC.hg19.knownGene)
> outputDir <- getwd()
> inputFilePath <- "MS1.fa"
> REpatternFile <- system.file("extdata", "NEBenzymes.fa", package = "CRISPRseek")
> offTargetAnalysis(inputFilePath, format = "fasta", findgRNAs = TRUE, exportAllgRNAs = c("all", "fasta", "genbank", "no"),findgRNAsWithREcutOnly = FALSE, REpatternFile, minREpatternSize = 6, overlap.gRNA.positions = c(17, 18), findPairedgRNAOnly = FALSE, min.gap = 0, max.gap = 20, gRNA.name.prefix = "gRNA", PAM.size = 3, gRNA.size = 20, PAM = "NGG", BSgenomeName = Hsapiens, txdb = TxDb.Hsapiens.UCSC.hg19.knownGene, chromToSearch = "all", max.mismatch = 4, PAM.pattern = "N[A|G]G$", allowed.mismatch.PAM = 1, gRNA.pattern = "", min.score = 0, topN = 1000, topN.OfftargetTotalScore = 10, annotateExon = TRUE, txdb, outputDir, fetchSequence=TRUE, upstream=200, downstream=200, weights=c(0, 0, 0.014, 0, 0, 0.395, 0.317, 0, 0.389, 0.079, 0.445, 0.508, 0.613, 0.851, 0.732, 0.828, 0.615, 0.804, 0.685, 0.583), overwrite=TRUE)
Validating input ...
Error in substr(outputDir, nchar(outputDir), nchar(outputDir)) :
argument "outputDir" is missing, with no default
Question: I use 'file' on top toolbar, 'change directory' function to set my outputdir. But I dont understand why my outputdir is missing.
btw I just change the name MS1.fa from MS1.fasta. Will that be OK? is MS1.fa the same as MS1.fasta (converted from MS1.txt via cluster2X)?