samples_memi {MatrixQCvis}R Documentation

Create tibble containing number of measured/missing features of samples

Description

'samples_memi' returns a 'tbl' with the number of measured/missing features of samples. The function will take as input a 'SummarizedExperiment' object and will access its 'assay()' slot

Usage

samples_memi(se)

Arguments

se

'SummarizedExperiment' object

Value

'tbl' with number of measured/missing features per sample

Examples

## create se
a <- matrix(1:100, nrow = 10, ncol = 10, 
            dimnames = list(1:10, paste("sample", 1:10)))
a[c(1, 5, 8), 1:5] <- NA
set.seed(1)
a <- a + rnorm(100)
sample <- data.frame(name = colnames(a), type = c(rep("1", 5), rep("2", 5)))
featData <- data.frame(spectra = rownames(a))
se <- SummarizedExperiment::SummarizedExperiment(assay = a, 
    rowData = featData, colData = sample)

## create the data.frame with information on number of measured/missing
## values
samples_memi(se)


[Package MatrixQCvis version 1.2.4 Index]