9f690aca |
##
## Importing
##
import(methods)
|
61dabc44 |
import(S4Vectors)
import(IRanges)
import(GenomicRanges)
import(SummarizedExperiment)
import(DelayedArray)
import(HDF5Array)
import(BiocParallel)
import(limma)
|
9f690aca |
importFrom(BiocGenerics, "anyDuplicated", "cbind", "colnames",
"combine", "density", "intersect", "lapply", "ncol",
"nrow", "order", "paste", "pmax", "pmin", "rbind",
"Reduce", "rep.int", "rownames", "sapply", "setdiff",
|
1823d04b |
"strand", "strand<-", "union", "unique", "updateObject", "unstrand")
|
9f690aca |
importFrom(stats, "approxfun", "fisher.test", "ppoints",
"predict", "preplot", "qchisq",
|
1debd557 |
"qqplot", "qunif", "cov2cor",
|
2420db83 |
"setNames")
|
9f690aca |
importFrom(graphics, "abline", "axis", "layout", "legend", "lines",
|
75b5aaa2 |
"mtext", "par", "plot", "points", "polygon", "rect", "rug", "text")
|
9f690aca |
import(parallel)
importFrom(locfit, "locfit", "lp")
|
02752743 |
importFrom(DelayedMatrixStats, "rowSds", "rowVars", "colMeans2", "colSums2",
|
d9114c77 |
"rowSums2", "rowMeans2", "rowAlls")
|
61dabc44 |
|
9f690aca |
importFrom(scales, "alpha")
importClassesFrom(Biobase, "AnnotatedDataFrame")
importMethodsFrom(Biobase, "annotatedDataFrameFrom",
"pData", "pData<-",
"sampleNames", "sampleNames<-")
|
8e0ebd64 |
importFrom(Biobase, "validMsg")
|
1823d04b |
importMethodsFrom(GenomeInfoDb, "seqlengths", "seqlengths<-", "seqinfo",
"seqinfo<-", "seqnames", "seqnames<-", "seqlevels",
"seqlevels<-", "sortSeqlevels")
importFrom(GenomeInfoDb, "Seqinfo")
|
f3518767 |
importFrom(gtools, "combinations")
|
c4abf2ab |
importFrom(Rcpp, sourceCpp)
|
1823d04b |
# NOTE: data.table has some NAMESPACE clashes with functions in Bioconductor,
# e.g., shift(). If new ones are discovered, add them to this list.
import(data.table, except = c(shift, first, second))
|
8657761a |
importFrom(permute, "shuffleSet", "how")
|
5aa8515c |
importFrom(Biostrings, "DNAString", "vmatchPattern", "reverseComplement")
|
1823d04b |
importFrom(utils, "read.delim")
|
ca5bb6e8 |
importFrom(BSgenome, "vmatchPattern")
|
868a6f2d |
importFrom(tools, "file_path_as_absolute")
|
65e163c3 |
importFrom(R.utils, "isGzipped", "isBzipped", "gunzip", "bunzip2")
|
5aa8515c |
|
9f690aca |
##
## Exporting
##
exportClasses("hasGRanges",
"BSseq",
"BSseqTstat",
|
65141d18 |
"BSseqStat",
|
9f690aca |
"matrixOrNULL")
exportMethods("[", "show",
"seqnames", "seqnames<-",
"seqlevels", "seqlevels<-",
"seqlengths", "seqlengths<-",
"start", "start<-",
"end", "end<-",
"width", "width<-",
"strand", "strand<-",
"granges",
"dim", "nrow", "ncol",
"sampleNames", "sampleNames<-",
"pData", "pData<-",
"findOverlaps", "subsetByOverlaps",
|
57cc26c6 |
"combine", "updateObject")
|
9f690aca |
export("BSseq", "getMeth", "getCoverage", "getBSseq", "getStats",
"collapseBSseq", "orderBSseq", "hasBeenSmoothed", "chrSelectBSseq",
"BSmooth", "BSmooth.tstat", "dmrFinder", "fisherTests",
|
20c8b3bb |
"combineList", "strandCollapse",
|
6b3c3233 |
"plotRegion", "plotManyRegions",
|
4278410a |
"read.umtab", "read.umtab2", "read.bsmooth", "read.bismark",
|
9f690aca |
"poissonGoodnessOfFit", "binomialGoodnessOfFit",
|
65141d18 |
"data.frame2GRanges", "BSseqTstat",
|
5aa8515c |
"BSseqStat",
|
57cc26c6 |
"findLoci")
|
9f690aca |
S3method("print", "chisqGoodnessOfFit")
S3method("plot", "chisqGoodnessOfFit")
S3method("print", "summary.BSseqTstat")
S3method("summary", "BSseqTstat")
S3method("plot", "BSseqTstat")
|
a0f0863d |
## Fixes, to be removed
|
e73ac2f3 |
exportMethods("assays", "assayNames")
|
a0f0863d |
|
866ab76f |
# C++ code registration
useDynLib(bsseq, .registration = TRUE, .fixes = "cxx_")
|