Nothing
test_that("importMicrobiotaProcess works without errors", {
testthat::skip_if_not_installed("phyloseq")
testthat::skip_if_not_installed("MicrobiotaProcess")
withr::local_package("phyloseq")
withr::local_package("MicrobiotaProcess")
fakeOTU = t(rTensor::k_unfold(rTensor::as.tensor(Fujita2023$data), 2)@data)
fakeTaxa = as.matrix(Fujita2023$mode2)
fakeSam = as.data.frame(cbind(rep(1:8, 110), rep(1:110, each=8)))
colnames(fakeSam) = c("replicate.id", "timepoint")
fakePhyloseq = phyloseq(otu_table(fakeOTU, taxa_are_rows=FALSE), phyloseq::tax_table(fakeTaxa), sample_data(fakeSam))
mpse = as.MPSE(fakePhyloseq)
expect_no_error(importMicrobiotaProcess(mpse, subjectIDs="replicate.id", thirdMode="timepoint", taxa_are_rows=TRUE))
})
test_that("importMicrobiotaProcess works without errors when taxa are rows", {
testthat::skip_if_not_installed("phyloseq")
testthat::skip_if_not_installed("MicrobiotaProcess")
withr::local_package("phyloseq")
withr::local_package("MicrobiotaProcess")
fakeOTU = rTensor::k_unfold(rTensor::as.tensor(Fujita2023$data), 2)@data
fakeTaxa = as.matrix(Fujita2023$mode2)
fakeSam = as.data.frame(cbind(rep(1:8, 110), rep(1:110, each=8)))
colnames(fakeSam) = c("replicate.id", "timepoint")
fakePhyloseq = phyloseq(otu_table(fakeOTU, taxa_are_rows=TRUE), phyloseq::tax_table(fakeTaxa), sample_data(fakeSam))
mpse = as.MPSE(fakePhyloseq)
expect_no_error(importMicrobiotaProcess(mpse, subjectIDs="replicate.id", thirdMode="timepoint", taxa_are_rows=TRUE))
})
test_that("importMicrobiotaProcess restructuring works as expected", {
testthat::skip_if_not_installed("phyloseq")
testthat::skip_if_not_installed("MicrobiotaProcess")
withr::local_package("phyloseq")
withr::local_package("MicrobiotaProcess")
fakeOTU = t(rTensor::k_unfold(rTensor::as.tensor(Fujita2023$data), 2)@data)
fakeTaxa = as.matrix(Fujita2023$mode2)
fakeSam = as.data.frame(cbind(rep(1:8, 110), rep(1:110, each=8)))
colnames(fakeSam) = c("replicate.id", "timepoint")
fakePhyloseq = phyloseq(otu_table(fakeOTU, taxa_are_rows=FALSE), phyloseq::tax_table(fakeTaxa), sample_data(fakeSam))
mpse = as.MPSE(fakePhyloseq)
result = importMicrobiotaProcess(mpse, subjectIDs="replicate.id", thirdMode="timepoint", taxa_are_rows=TRUE)
expect_equal(Fujita2023$data, result$data)
})
test_that("importMicrobiotaProcess restructuring works as expected when taxa are rows", {
testthat::skip_if_not_installed("phyloseq")
testthat::skip_if_not_installed("MicrobiotaProcess")
withr::local_package("phyloseq")
withr::local_package("MicrobiotaProcess")
fakeOTU = t(rTensor::k_unfold(rTensor::as.tensor(Fujita2023$data), 2)@data)
fakeTaxa = as.matrix(Fujita2023$mode2)
fakeSam = as.data.frame(cbind(rep(1:8, 110), rep(1:110, each=8)))
colnames(fakeSam) = c("replicate.id", "timepoint")
fakePhyloseq = phyloseq(otu_table(fakeOTU, taxa_are_rows=FALSE), phyloseq::tax_table(fakeTaxa), sample_data(fakeSam))
mpse = as.MPSE(fakePhyloseq)
result = importMicrobiotaProcess(mpse, subjectIDs="replicate.id", thirdMode="timepoint", taxa_are_rows=TRUE)
expect_equal(Fujita2023$data, result$data)
})
test_that("importMicrobiotaProcess throws errors without a TreeSummarizedExperiment object", {
testthat::skip_if_not_installed("phyloseq")
testthat::skip_if_not_installed("MicrobiotaProcess")
expect_error(importMicrobiotaProcess(Fujita2023, subjectIDs="replicate.id", thirdMode="timepoint", taxa_are_rows=TRUE))
})
test_that("importMicrobiotaProcess gives an error if sample info is missing", {
testthat::skip_if_not_installed("phyloseq")
testthat::skip_if_not_installed("MicrobiotaProcess")
withr::local_package("phyloseq")
withr::local_package("MicrobiotaProcess")
fakeOTU = t(rTensor::k_unfold(rTensor::as.tensor(Fujita2023$data), 2)@data)
fakeTaxa = as.matrix(Fujita2023$mode2)
fakePhyloseq = phyloseq(otu_table(fakeOTU, taxa_are_rows=FALSE), phyloseq::tax_table(fakeTaxa))
mpse = as.MPSE(fakePhyloseq)
expect_error(importMicrobiotaProcess(mpse, subjectIDs="replicate.id", thirdMode="timepoint", taxa_are_rows=TRUE))
})
Any scripts or data that you put into this service are public.
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.