Skip to content

Commit

Permalink
[ci-skip] Add donttest
Browse files Browse the repository at this point in the history
  • Loading branch information
timoast committed Aug 13, 2020
1 parent a967b91 commit c53f270
Show file tree
Hide file tree
Showing 4 changed files with 14 additions and 0 deletions.
4 changes: 4 additions & 0 deletions R/objects.R
Original file line number Diff line number Diff line change
Expand Up @@ -1332,7 +1332,9 @@ setMethod(
#' @export
#' @concept assay
#' @examples
#' \donttest{
#' Annotation(atac_small[["peaks"]])
#' }
Annotation.ChromatinAssay <- function(object, ...) {
return(slot(object = object, name = "annotation"))
}
Expand All @@ -1344,7 +1346,9 @@ Annotation.ChromatinAssay <- function(object, ...) {
#' @export
#' @concept assay
#' @examples
#' \donttest{
#' Annotation(atac_small)
#' }
Annotation.Seurat <- function(object, ...) {
assay <- DefaultAssay(object = object)
return(Annotation(object = object[[assay]]))
Expand Down
2 changes: 2 additions & 0 deletions R/preprocessing.R
Original file line number Diff line number Diff line change
Expand Up @@ -502,6 +502,7 @@ FRiP <- function(
#' @concept utilities
#' @return Returns a sparse matrix
#' @examples
#' \donttest{
#' genome <- 780007
#' names(genome) <- 'chr1'
#' fpath <- system.file("extdata", "fragments.tsv.gz", package="Signac")
Expand All @@ -511,6 +512,7 @@ FRiP <- function(
#' genome = genome,
#' binsize = 1000
#' )
#' }
GenomeBinMatrix <- function(
fragments,
genome,
Expand Down
2 changes: 2 additions & 0 deletions R/utilities.R
Original file line number Diff line number Diff line change
Expand Up @@ -334,8 +334,10 @@ ConnectionsToLinks <- function(conns, ccans = NULL, threshold = 0) {
#' @export
#' @concept utilities
#' @examples
#' \donttest{
#' fc <- FoldChange(object = atac_small, ident.1 = 0)
#' head(fc)
#' }
FoldChange <- function(
object,
ident.1,
Expand Down
6 changes: 6 additions & 0 deletions R/visualization.R
Original file line number Diff line number Diff line change
Expand Up @@ -796,9 +796,11 @@ TSSPlot <- function(
#' @importFrom patchwork wrap_plots plot_layout guide_area
#' @concept visualization
#' @examples
#' \donttest{
#' p1 <- PeakPlot(atac_small, region = "chr1-29554-39554")
#' p2 <- AnnotationPlot(atac_small, region = "chr1-29554-39554")
#' CombineTracks(plotlist = list(p1, p2), heights = c(1, 1))
#' }
CombineTracks <- function(
plotlist,
expression.plot = NULL,
Expand Down Expand Up @@ -980,7 +982,9 @@ LinkPlot <- function(object, region) {
#' @importFrom fastmatch fmatch
#' @concept visualization
#' @examples
#' \donttest{
#' AnnotationPlot(object = atac_small, region = c("chr1-29554-39554"))
#' }
AnnotationPlot <- function(object, region) {
annotation <- Annotation(object = object)
if (is.null(x = annotation)) {
Expand Down Expand Up @@ -1688,6 +1692,7 @@ VariantPlot <- function(
#' @export
#' @concept visualization
#' @examples
#' \donttest{
#' fpath <- system.file("extdata", "fragments.tsv.gz", package="Signac")
#' fragments <- CreateFragmentObject(
#' path = fpath,
Expand All @@ -1696,6 +1701,7 @@ VariantPlot <- function(
#' )
#' Fragments(atac_small) <- fragments
#' TilePlot(object = atac_small, region = c("chr1-713500-714500"))
#' }
TilePlot <- function(
object,
region,
Expand Down

0 comments on commit c53f270

Please sign in to comment.