Browse code

add a few missing imports

git-svn-id: file:///home/git/hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/SplicingGraphs@98054 bc3139a8-67e5-0310-9ffc-ced21a209358

Herve Pages authored on 06/01/2015 07:58:11
Showing 4 changed files

... ...
@@ -10,14 +10,11 @@ Description: This package allows the user to create, manipulate, and visualize
10 10
 	the edges of a set of splicing graphs, and to summarize them in
11 11
         different ways.
12 12
 Maintainer: H. Pages <[email protected]>
13
-Depends: BiocGenerics,
14
-	 S4Vectors (>= 0.5.16), IRanges (>= 1.99.21),
15
-	 GenomicRanges (>= 1.17.22), GenomicFeatures (>= 1.17.13),
16
-	 GenomicAlignments (>= 1.1.22), Rgraphviz (>= 2.3.7)
13
+Depends: GenomicFeatures (>= 1.17.13), GenomicAlignments (>= 1.1.22),
14
+	 Rgraphviz (>= 2.3.7)
17 15
 Imports: methods, utils, igraph,
18
-	 BiocGenerics,
19
-	 IRanges, GenomicRanges, GenomicFeatures, GenomicAlignments,
20
-	 graph, Rgraphviz
16
+	 BiocGenerics, S4Vectors, IRanges, GenomeInfoDb, GenomicRanges,
17
+	 GenomicFeatures, GenomicAlignments, graph, Rgraphviz
21 18
 Suggests: igraph, Gviz, Rsamtools (>= 1.19.17),
22 19
 	 TxDb.Hsapiens.UCSC.hg19.knownGene, RNAseqData.HNRNPC.bam.chr14,
23 20
 	 RUnit
... ...
@@ -8,14 +8,15 @@ importFrom(igraph, graph.data.frame, get.data.frame, layout.kamada.kawai,
8 8
 import(BiocGenerics)
9 9
 import(S4Vectors)
10 10
 import(IRanges)
11
+import(GenomeInfoDb)
11 12
 import(GenomicRanges)
12 13
 import(GenomicFeatures)
13 14
 import(GenomicAlignments)
14 15
 
15 16
 importFrom(graph, nodeDataDefaults, nodeData,
16
-                  edgeDataDefaults, edgeNames, edgeData)
17
+                  edgeDataDefaults, edgeNames, edgeData, edgemode)
17 18
 
18
-importFrom(Rgraphviz, agopen)
19
+importFrom(Rgraphviz, agopen, buildEdgeList, buildNodeList, from, to)
19 20
 
20 21
 exportClasses(GeneModel, SplicingGraphs)
21 22
 
... ...
@@ -18,6 +18,10 @@ toy_reads_sam <- function()
18 18
 
19 19
 toy_reads_bam <- function()
20 20
 {
21
+    ## The Rsamtools package is needed for asBam().
22
+    if (!requireNamespace("Rsamtools", quietly=TRUE))
23
+        stop("Couldn't load the Rsamtools package. Please install ",
24
+             "the Rsamtools\n  package and try again.")
21 25
     toy_reads_bam <- try(get("toy_reads_bam", envir=.toy_reads_bam_cache,
22 26
                              inherits=FALSE), silent=TRUE)
23 27
     if (!is(toy_reads_bam, "try-error"))
... ...
@@ -65,7 +65,7 @@ make_TSPC_SplicinGraphs <- function(subdir_paths)
65 65
         })
66 66
     suppressWarnings(ex_by_tx <- do.call(c, unname(gene_list)))
67 67
     ex_by_tx_seqlevels <- seqlevels(ex_by_tx)
68
-    seq_rank <- makeSeqnameIds(ex_by_tx_seqlevels)
68
+    seq_rank <- rankSeqlevels(ex_by_tx_seqlevels)
69 69
     seqlevels(ex_by_tx) <- ex_by_tx_seqlevels[order(seq_rank)]
70 70
     grouping <- rep.int(basename(subdir_paths), elementLengths(gene_list))
71 71
     SplicingGraphs(ex_by_tx, grouping=grouping, min.ntx=1L)