parseQubicBlocks {rqubic} | R Documentation |
These functions parse output files of the QUBIC command line tool developed by Ma et al.
parseQubicRules(filename) parseQubicChars(file, check.names=FALSE, ...) parseQubicBlocks(filename)
filename |
Input filename |
file |
Input filename |
check.names |
logical, should the column names be checked? |
... |
other parameters passed to the |
Parse QUBIC Command Line Tool Output Files
parseQubicRules
and parseQubicChars
both return a data
frame.
parseQubicBlocks
returns an instance of
QUBICBiclusterSet
class.
Jitao David Zhang <jitao_david.zhang@roche.com>
http://csbl.bmb.uga.edu/~maqin/bicluster/
getRqubicFile <- function(filename) system.file("extdata", filename, package="rqubic") ## parse QUBIC rules rule.file <- getRqubicFile("sampleExpressionSet.rules") rqubic.sample.rule <- parseQubicRules(rule.file) ## parse QUBIC chars chars.file <- getRqubicFile("sampleExpressionSet.chars") rqubic.sample.chars <- parseQubicChars(chars.file) ## parse QUBIC blocks block.file <- getRqubicFile("sampleExpressionSet.blocks") rqubic.sample.data <- parseQubicBlocks(block.file)