Browse code

Use enhanced base::sequence() instead of S4Vectors:::fancy_mseq()

Hervé Pagès authored on 03/11/2020 05:28:26
Showing 2 changed files

... ...
@@ -11,7 +11,7 @@ biocViews: Genetics, Annotation, DataRepresentation, Visualization,
11 11
 	ImmunoOncology
12 12
 URL: https://bioconductor.org/packages/SplicingGraphs
13 13
 BugReports: https://github.com/Bioconductor/SplicingGraphs/issues
14
-Version: 1.31.0
14
+Version: 1.31.1
15 15
 License: Artistic-2.0
16 16
 Encoding: UTF-8
17 17
 Author: D. Bindreither, M. Carlson, M. Morgan, H. Pagès
... ...
@@ -20,7 +20,7 @@ load_TSPC_gene_model <- function(models_path, check.transcripts=TRUE)
20 20
     exons_end <- tmp2[c(FALSE, TRUE)]
21 21
     exons_ranges <- IRanges(exons_start, exons_end)
22 22
     exon_id <- rep.int(NA_integer_, length(exons_ranges))
23
-    exon_rank <- S4Vectors:::fancy_mseq(runLength(Rle(models[[2L]])))
23
+    exon_rank <- sequence(runLength(Rle(models[[2L]])))
24 24
     unlisted_ans <- GRanges(seqnames=exons_seqnames,
25 25
                             ranges=exons_ranges,
26 26
                             exon_id=exon_id,