Nothing
      #' A function for computing quality surrogate variables (qSVs)
#'
#' This function computes quality surrogate variables (qSVs)
#' from the library-size- and read-length-normalized 
#' degradation matrix for subsequent RNA quality correction
#' 
#' @param degradationMatrix the normalized degradation matrix, region by sample
#' @param mod (Optional) statistical model used in DE analysis
#'
#' @return the qSV adjustment variables
#'
#' @examples
#'
#' ## Find files
#' bwPath <- system.file('extdata', 'bwtool', package = 'sva')
#'
#' ## Read the data
#' degCovAdj = read.degradation.matrix(
#'  covFiles = list.files(bwPath,full.names=TRUE),
#'  sampleNames = list.files(bwPath), readLength = 76, 
#'  totalMapped = rep(100e6,5),type="bwtool")
#'
#' ## Input data
#'  head(degCovAdj)
#'
#' ## Results
#' qsva(degCovAdj)
#'
#' @export
qsva <- function(degradationMatrix, 
		mod = matrix(1, ncol=1, nrow = ncol(degradationMatrix))) {
	# do PCA
	degPca = prcomp(t(log2(degradationMatrix+1)))
	## how many PCs?
	k = num.sv(log2(degradationMatrix+1), mod)
	# return qSVS
	degPca$x[, seq_len(k)]
}
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.