| Amellifera {BSgenome.Amellifera.BeeBase.assembly4} | R Documentation |
Apis mellifera (Honey Bee) full genome as provided by BeeBase (assembly4, Feb. 2008) and stored in Biostrings objects.
This BSgenome data package was made from the following source data files:
-- information not available --See
?BSgenomeForge and the BSgenomeForge
vignette (vignette("BSgenomeForge")) in the BSgenome software
package for how to make a BSgenome data package.
H. Pages
BSgenome-class,
DNAString-class,
available.genomes,
BSgenomeForge
Amellifera
seqlengths(Amellifera)
Amellifera$Group1 # same as Amellifera[["Group1"]]
if ("AGAPS" %in% masknames(Amellifera)) {
## Check that the assembly gaps contain only Ns:
checkOnlyNsInGaps <- function(seq)
{
## Replace all masks by the inverted AGAPS mask
masks(seq) <- gaps(masks(seq)["AGAPS"])
af <- alphabetFrequency(seq)
found_letters <- names(af)[af != 0]
if (any(found_letters != "N"))
stop("assembly gaps contain more than just Ns")
}
## A message will be printed each time a sequence is removed
## from the cache:
options(verbose=TRUE)
for (seqname in seqnames(Amellifera)) {
cat("Checking sequence", seqname, "... ")
seq <- Amellifera[[seqname]]
checkOnlyNsInGaps(seq)
cat("OK\n")
}
}
## See the GenomeSearching vignette in the BSgenome software
## package for some examples of genome-wide motif searching using
## Biostrings and the BSgenome data packages:
if (interactive())
vignette("GenomeSearching", package="BSgenome")