tests/test-null.R

require(shiny)
library(debrowser)
library(testthat)

test_that("passing no data returns NULL", {
    expect_null(compareClust() )
    expect_null(getGOPlots(NULL, NULL))
    null_deseq <- runDE(NULL)
    expect_null(null_deseq)
    expect_null(plot_pca(NULL))
})
nephantes/debrowser_bioconductor_release documentation built on May 29, 2019, 7:15 a.m.