... | ... |
@@ -1994,13 +1994,6 @@ UcscTrack <- function(track, table = NULL, trackType = c( |
1994 | 1994 |
} |
1995 | 1995 |
|
1996 | 1996 |
|
1997 |
- |
|
1998 |
-## AlignedReadTrack ---------------------------------------------------------------------------------------------------- |
|
1999 |
-AlignedReadTrack <- function() { |
|
2000 |
- .Defunct("AlignmentsTrack") |
|
2001 |
-} |
|
2002 |
- |
|
2003 |
- |
|
2004 | 1997 |
## SequenceTrack ------------------------------------------------------------------------------------------------------- |
2005 | 1998 |
## |
2006 | 1999 |
## SequenceTrack: A generic track to visualize nucleotide sequences. This class is virtual. |
... | ... |
@@ -319,7 +319,7 @@ allDisplayParsDoc <- function(details) { |
319 | 319 |
require(Gviz) |
320 | 320 |
text <- indent(c("\\section{Display Parameters}{", "\\describe{"), level=0:1) |
321 | 321 |
for(cl in c("GenomeAxisTrack", "DataTrack", "IdeogramTrack", |
322 |
- "AnnotationTrack", "GeneRegionTrack", "BiomartGeneRegionTrack", "AlignmentsTrack", "AlignedReadTrack")) |
|
322 |
+ "AnnotationTrack", "GeneRegionTrack", "BiomartGeneRegionTrack", "AlignmentsTrack")) |
|
323 | 323 |
{ |
324 | 324 |
parents <- names(getClassDef(cl)@contains) |
325 | 325 |
pars <- sapply(c(cl, parents), function(x) as.list(getClassDef(x)@prototype@dp), simplify=FALSE) |
... | ... |
@@ -703,16 +703,6 @@ details <- list( |
703 | 703 |
"verbose"="Logical scalar. Report data loading events from Bioamart or retrieval from cache." |
704 | 704 |
), |
705 | 705 |
|
706 |
- AlignedReadTrack=c( |
|
707 |
- |
|
708 |
- collapse="collapse overlapping ranges and aggregate the underlying data.", |
|
709 |
- detail="the amount of detail to plot the data. Either \\code{coverage} to show the coverage only, or \\code{reads} to show individual reads. For large data sets the latter can be very inefficient. Please note that \\code{reads} is only available when the object has been created with option \\code{coverageOnly=FALSE}.", |
|
710 |
- fill="the fill color for the coverage indicator.", |
|
711 |
- size="the relative size of the track. Defaults to size selection based on the underlying data. Can be overridden in the \\code{\\link{plotTracks}} function.", |
|
712 |
- type="the plot type, one or several in \\code{c(\"p\",\"l\", \"b\", \"a\", \"s\", \"g\", \"r\", \"S\", \"smooth\", \"histogram\", \"mountain\", \"polygon\", \"h\", \"boxplot\", \"gradient\", \"heatmap\", \"horizon\")}. See the 'Details' section in \\code{\\linkS4class{DataTrack}} for more information on the individual plotting types." |
|
713 |
- |
|
714 |
- ), |
|
715 |
- |
|
716 | 706 |
SequenceTrack=c( |
717 | 707 |
|
718 | 708 |
add53="Logical scalar. Add a direction indicator.", |
... | ... |
@@ -815,7 +805,7 @@ updateDocumentation <- function(outdir="~/Rpacks/Gviz/man") |
815 | 805 |
library(AnnotationDbi) |
816 | 806 |
##source(file.path(dirname(outdir), "inst/scripts/sourcePackage.R")) |
817 | 807 |
dps <- sapply(c("GdObject", "GenomeAxisTrack", "RangeTrack", "NumericTrack", "DataTrack", "IdeogramTrack", "StackedTrack", |
818 |
- "AnnotationTrack", "GeneRegionTrack", "BiomartGeneRegionTrack", "AlignedReadTrack", "AlignmentsTrack"), |
|
808 |
+ "AnnotationTrack", "GeneRegionTrack", "BiomartGeneRegionTrack", "AlignmentsTrack"), |
|
819 | 809 |
updateRdFile, outdir) |
820 | 810 |
settings <- updateSettingsFile(outdir) |
821 | 811 |
links <- updateLinks(outdir) |
... | ... |
@@ -1,9 +1,8 @@ |
1 | 1 |
\name{Gviz-defunct} |
2 |
-\alias{AlignedReadTrack} |
|
3 | 2 |
\title{Defunct functions in package \sQuote{Gviz}} |
4 | 3 |
|
5 | 4 |
\description{These functions are defunct and no longer available.} |
6 | 5 |
|
7 | 6 |
\details{ |
8 |
- Defunct functions are: \code{AlignedReadTrack} |
|
7 |
+ Defunct functions are: |
|
9 | 8 |
} |