## ---- include = FALSE--------------------------------------------------------- knitr::opts_chunk$set( collapse = TRUE, comment = "#>" ) ## ----------------------------------------------------------------------------- suppressPackageStartupMessages({ library("waddR") library("SingleCellExperiment") library("BiocFileCache") }) ## ----------------------------------------------------------------------------- url.base <- "https://github.com/goncalves-lab/waddR-data/blob/master/data/" sce.blood.url <- paste0(url.base, "sce_blood.RDa?raw=true") sce.decidua.url <- paste0(url.base, "sce_decidua.RDa?raw=true") getCachedPath <- function(url, rname){ bfc <- BiocFileCache() # fire up cache res <- bfcquery(bfc, url, field="fpath", exact=TRUE) if (bfccount(res) == 0L) cachedFilePath <- bfcadd(bfc, rname=rname, fpath=url) else cachedFilePath <- bfcpath(bfc, res[["rid"]]) cachedFilePath } load(getCachedPath(sce.blood.url, "sce.blood")) load(getCachedPath(sce.decidua.url, "sce.decidua")) ## ----------------------------------------------------------------------------- set.seed(28) randgenes <- sample(rownames(sce.blood), 2500, replace=FALSE) sce.blood <- sce.blood[randgenes, ] sce.decidua <- sce.decidua[randgenes, ] ## ----------------------------------------------------------------------------- assays(sce.blood) assays(sce.decidua) ## ----------------------------------------------------------------------------- wsres <- wasserstein.sc(sce.blood, sce.decidua, "OS") head(wsres, n=10L) ## ----session-info------------------------------------------------------------- sessionInfo()