Skip to content

Commit

Permalink
cleanup namespace
Browse files Browse the repository at this point in the history
  • Loading branch information
kriemo committed Sep 19, 2023
1 parent 87a4573 commit 35d1824
Show file tree
Hide file tree
Showing 8 changed files with 6 additions and 16 deletions.
5 changes: 2 additions & 3 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -28,8 +28,8 @@ export(pileup_sites)
export(raer_example)
export(read_sparray)
import(GenomicRanges)
import(IRanges)
import(S4Vectors)
import(SingleCellExperiment)
import(SummarizedExperiment)
importFrom(BSgenome,snpsByOverlaps)
importFrom(BiocFileCache,BiocFileCache)
Expand Down Expand Up @@ -59,9 +59,9 @@ importFrom(GenomicAlignments,readGAlignments)
importFrom(GenomicFeatures,genes)
importFrom(GenomicFeatures,intronsByTranscript)
importFrom(GenomicFeatures,mapToTranscripts)
importFrom(GenomicRanges,GRanges)
importFrom(IRanges,IRanges)
importFrom(IRanges,extractList)
importFrom(IRanges,grouplengths)
importFrom(IRanges,subsetByOverlaps)
importFrom(Matrix,colSums)
importFrom(Matrix,sparseMatrix)
Expand All @@ -78,7 +78,6 @@ importFrom(Rsamtools,scanFaIndex)
importFrom(Rsamtools,seqinfo)
importFrom(S4Vectors,aggregate)
importFrom(S4Vectors,unstrsplit)
importFrom(SingleCellExperiment,SingleCellExperiment)
importFrom(data.table,fread)
importFrom(methods,"slot<-")
importFrom(methods,as)
Expand Down
2 changes: 1 addition & 1 deletion R/cache.R
Original file line number Diff line number Diff line change
Expand Up @@ -36,7 +36,7 @@ download_GSE99249 <- function(verbose = TRUE) {
bfc <- .get_cache()
fls <- unlist(GSE99249_files)
fl_paths <- .add_files(fls, paste0(baseURL, fls), bfc, verbose)
fl_paths <- relist(fl_paths, GSE99249_files)
fl_paths <- utils::relist(fl_paths, GSE99249_files)
fl_paths
}

Expand Down
2 changes: 0 additions & 2 deletions R/calc_AEI.R
Original file line number Diff line number Diff line change
Expand Up @@ -59,8 +59,6 @@
#' @importFrom rtracklayer export
#' @importFrom Rsamtools scanBamHeader
#' @importFrom IRanges subsetByOverlaps
#' @import S4Vectors
#' @import GenomicRanges
#'
#' @export
calc_AEI <- function(bamfiles,
Expand Down
3 changes: 0 additions & 3 deletions R/differential_editing.R
Original file line number Diff line number Diff line change
Expand Up @@ -34,7 +34,6 @@
#' rse <- calc_edit_frequency(rse_adar_ifn)
#' assay(rse, "edit_freq")[1:5, ]
#'
#' @import SummarizedExperiment
#' @importFrom Matrix colSums
#' @export
calc_edit_frequency <- function(rse,
Expand Down Expand Up @@ -126,7 +125,6 @@ calc_edit_frequency <- function(rse,
#' @param min_count OPTIONAL the number of reads used to determine the number of
#' edited sites. Default is 10.
#'
#' @import SummarizedExperiment
#' @importFrom Matrix colSums
#' @noRd
#' @keywords internal
Expand Down Expand Up @@ -169,7 +167,6 @@ count_edits <- function(se, edit_frequency = 0.01, min_count = 10,
#' @param min_samples The minimum number of samples passing the `min_prop` and
#' `max_prop` cutoffs to keep a site.
#'
#' @import SummarizedExperiment
#'
#' @returns [RangedSummarizedExperiment] for use with `edgeR` or
#' `DESeq2`. Contains a `counts` assay with a matrix formatted
Expand Down
3 changes: 0 additions & 3 deletions R/pileup.R
Original file line number Diff line number Diff line change
Expand Up @@ -86,7 +86,6 @@
#'
#' @importFrom BiocGenerics path
#' @importFrom Rsamtools index scanFaIndex seqinfo BamFile BamFileList
#' @importFrom GenomicRanges GRanges
#' @importFrom IRanges IRanges
#' @importFrom GenomeInfoDb seqlevels seqinfo seqlengths
#' @importFrom BiocParallel SerialParam bpstop bplapply
Expand Down Expand Up @@ -664,8 +663,6 @@ gr_to_cregions <- function(gr) {
#'
#' @return `RangedSummarizedExperiment` populated with assays specified in
#' `assay_cols`.
#' @import GenomicRanges
#' @import SummarizedExperiment
#' @importFrom IRanges extractList
#' @keywords internal
#' @noRd
Expand Down
3 changes: 2 additions & 1 deletion R/raer.R
Original file line number Diff line number Diff line change
@@ -1,6 +1,7 @@
#' @docType package
#' @name raer

#'
#' @import SingleCellExperiment SummarizedExperiment GenomicRanges S4Vectors
#' @importFrom utils download.file
#' @importFrom methods is new as
#' @importFrom Biostrings vmatchPattern
Expand Down
1 change: 0 additions & 1 deletion R/sc-pileup.R
Original file line number Diff line number Diff line change
Expand Up @@ -355,7 +355,6 @@ get_sc_pileup <- function(bamfn, index, id, sites, barcodes,
#'
#' @importFrom data.table fread
#' @importFrom Matrix sparseMatrix
#' @importFrom SingleCellExperiment SingleCellExperiment
#' @importFrom R.utils gzip
#' @export
read_sparray <- function(mtx_fn, sites_fn, bc_fn,
Expand Down
3 changes: 1 addition & 2 deletions R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -67,7 +67,7 @@ unlist_w_names <- function(x) {
#' overlapping independent regions found in each chunk (dictated by `n_reads_per_chunk`).
#' The `A_freq` column indicates the frequency of A bases within the region.
#'
#' @import GenomicRanges S4Vectors IRanges
#' @importFrom IRanges grouplengths
#' @importFrom Rsamtools ScanBamParam BamFile
#' @importFrom GenomicAlignments readGAlignments
#' @examples
Expand Down Expand Up @@ -150,7 +150,6 @@ empty_mispriming_record <- function() {
gr
}

#' @import GenomicRanges
merge_pa_peaks <- function(gr) {
# get 3' end of read
start(gr[strand(gr) == "+"]) <- end(gr[strand(gr) == "+"])
Expand Down

0 comments on commit 35d1824

Please sign in to comment.