R/decomposition.R

Defines functions pcaSignatures pcaDecomposition kmeansSignatures kmeansDecomposition nmfSignatures nmfDecomposition

Documented in nmfDecomposition nmfSignatures pcaDecomposition pcaSignatures

nmfDecomposition <- function(x, r, ..., includeFit = FALSE) {
    
    y = NMF::nmf(x, r, ...)

    w = basis(y) ## signatures x k
    h = t(coef(y)) ## samples x k

    ## order signatures
    ord = order(rowMax(t(w)), decreasing = TRUE)
    w = w[ ,ord]
    h = h[ ,ord]
    
    ## name signatures: S1, ..., Sn
    sig_names = paste0("S", 1:r)
    colnames(w) = colnames(h) = sig_names
    v = fitted(y)

    res = list(w = w, h = h, v = v, m = x, r = r)
    if(includeFit)
        res[["raw"]] = y

    return(res)
}

nmfSignatures <- function(x, r, ..., includeFit = FALSE) {
    nmfDecomposition(x, r, ..., includeFit = FALSE)
}

kmeansDecomposition <- function(x, r, ..., includeFit = FALSE) {

    y = kmeans(t(x), centers = r)
    
    w = t(y$centers)
    n_samples = ncol(x)
    h = matrix(0, r, n_samples)
    h[ cbind(as.vector(y$cluster), 1:n_samples) ] = 1
    h = matrix(0, n_samples, r)
    h[ cbind(1:n_samples, as.vector(y$cluster)) ] = 1
    stopifnot(all(rowSums(h) == 1))

    ## name signatures: S1, ..., Sn
    sig_names = paste0("S", 1:r)
    colnames(w) = colnames(h) = sig_names
    v = fitted(y)

    res = list(w = w, h = h, v = v, m = x, r = r)
    if(includeFit)
        res[["raw"]] = y

    return(res)    
}

kmeansSignatures <- function(x, r, ..., includeFit = FALSE) {
    kmeansDecomposition(x, r, ..., includeFit = FALSE)
}

pcaDecomposition <- function(x, r, ..., includeFit = FALSE) {
  
    y = pca(x, "svd", r, scale = "uv", ...)
    w = scores(y) ## signatures x k
    h = loadings(y) ## samples x k
    v = fitted(y) 
    
    ## name signatures: S1, ..., Sn
    sig_names = paste0("S", 1:r)      
    colnames(w) = colnames(h) = sig_names

    res = list(w = w, h = h, v = v, m = x, r = r)
    if(includeFit)
        res[["raw"]] = y
    
    return(res)    
}

pcaSignatures <- function(x, r, ..., includeFit = FALSE) {
    pcaDecomposition(x, r, ..., includeFit = FALSE)
}

Try the SomaticSignatures package in your browser

Any scripts or data that you put into this service are public.

SomaticSignatures documentation built on Nov. 8, 2020, 5:52 p.m.