Browse code

Add new txdbmaker package to Suggests

Hervé Pagès authored on 18/03/2024 17:15:15
Showing 5 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.43.0
14
+Version: 1.43.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,9 +20,8 @@ Depends: GenomicFeatures (>= 1.17.13), GenomicAlignments (>= 1.1.22),
20 20
 	 Rgraphviz (>= 2.3.7)
21 21
 Imports: methods, utils, graphics, igraph, BiocGenerics,
22 22
 	 S4Vectors (>= 0.17.5), BiocParallel, IRanges (>= 2.21.2),
23
-	 GenomeInfoDb, GenomicRanges (>= 1.23.21), GenomicFeatures, Rsamtools,
24
-	 GenomicAlignments, graph, Rgraphviz
25
-Suggests: igraph, Gviz,
23
+	 GenomeInfoDb, GenomicRanges (>= 1.23.21), Rsamtools, graph
24
+Suggests: igraph, Gviz, txdbmaker,
26 25
 	 TxDb.Hsapiens.UCSC.hg19.knownGene, RNAseqData.HNRNPC.bam.chr14,
27 26
 	 RUnit
28 27
 Collate: utils.R
... ...
@@ -1,5 +1,5 @@
1 1
 import(methods)
2
-import(utils)
2
+importFrom(utils, read.table)
3 3
 importFrom(graphics, plot)
4 4
 
5 5
 importFrom(igraph, vcount, vertex_attr, ecount, edge_attr, as_edgelist,
... ...
@@ -4,7 +4,7 @@
4 4
 
5 5
 .make_toy_sg <- function()
6 6
 {
7
-     library(GenomicFeatures)
7
+     library(txdbmaker)
8 8
      suppressWarnings(
9 9
        toy_genes_txdb <- makeTxDbFromGFF(toy_genes_gff())
10 10
      )
... ...
@@ -240,7 +240,7 @@ SplicingGraphs(x, grouping=NULL, min.ntx=2, max.ntx=NA, check.introns=TRUE)
240 240
 ## 1. Load a toy gene model as a TxDb object
241 241
 ## ---------------------------------------------------------------------
242 242
 
243
-library(GenomicFeatures)
243
+library(txdbmaker)
244 244
 suppressWarnings(
245 245
   toy_genes_txdb <- makeTxDbFromGFF(toy_genes_gff())
246 246
 )
... ...
@@ -40,8 +40,10 @@ toy_overlaps()
40 40
           \link[GenomicAlignments]{GAlignmentPairs} classes defined
41 41
           in the \pkg{GenomicAlignments} package.
42 42
 
43
-    \item The \code{\link[GenomicFeatures]{makeTxDbFromGFF}}
44
-          function and the \link[GenomicFeatures]{TxDb} class
43
+    \item The \code{\link[txdbmaker]{makeTxDbFromGFF}}
44
+          function in the \pkg{txdbmaker} package.
45
+
46
+    \item The \link[GenomicFeatures]{TxDb} class
45 47
           defined in the \pkg{GenomicFeatures} package.
46 48
   }
47 49
 }
... ...
@@ -55,7 +57,7 @@ toy_genes_gff()
55 57
 ## Note that you can display the content of the file with:
56 58
 cat(readLines(toy_genes_gff()), sep="\n")
57 59
 
58
-library(GenomicFeatures)
60
+library(txdbmaker)
59 61
 suppressWarnings(
60 62
   txdb <- makeTxDbFromGFF(toy_genes_gff())
61 63
 )