\name{Hsapiens}
\docType{package}

\alias{BSgenome.Hsapiens.UCSC.hg17-package}
\alias{BSgenome.Hsapiens.UCSC.hg17}
\alias{Hsapiens}


\title{Homo sapiens (Human) full genome (UCSC version hg17)}

\description{
  Homo sapiens (Human) full genome as provided by UCSC (hg17, May 2004) and stored in Biostrings objects.
}

\details{
  
}

\note{
  This BSgenome data package was made from the following source data files:
  \preformatted{
sequences: chromFa.zip, upstream1000.zip, upstream2000.zip, upstream5000.zip
from http://hgdownload.cse.ucsc.edu/goldenPath/hg17/bigZips/
AGAPS masks: all the chr*_gap.txt.gz files from ftp://hgdownload.cse.ucsc.edu/goldenPath/hg17/database/
RM masks: http://hgdownload.cse.ucsc.edu/goldenPath/hg17/bigZips/chromOut.zip
TRF masks: http://hgdownload.cse.ucsc.edu/goldenPath/hg17/bigZips/chromTrf.zip
  }
  See \code{?\link[BSgenome]{BSgenomeForge}} and the BSgenomeForge
  vignette (\code{vignette("BSgenomeForge")}) in the BSgenome software
  package for how to make a BSgenome data package.
}

\author{H. Pages}

\seealso{
  \link[BSgenome]{BSgenome-class},
  \link[Biostrings]{DNAString-class},
  \code{\link[BSgenome]{available.genomes}},
  \link[BSgenome]{BSgenomeForge}
}

\examples{
Hsapiens
seqlengths(Hsapiens)
Hsapiens$chr1  # same as Hsapiens[["chr1"]]

if ("AGAPS" \%in\% masknames(Hsapiens)) {

  ## 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"])
    unique_letters <- uniqueLetters(seq)
    if (any(unique_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(Hsapiens)) {
    cat("Checking sequence", seqname, "... ")
    seq <- Hsapiens[[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")
}

\keyword{package}
\keyword{data}