mergeSplitObjects {affyPara}R Documentation

Merge a list of split objects

Description

Functions to merge or combine a list of split objects (AffyBatch, Matrix).

Usage

mergeAffyBatches(abatch.list, description = NULL, notes = character(0))
combineMatrices(matrix.list, verbose=FALSE)

Arguments

abatch.list A list of objects of class AffyBatch.
description A MIAME object.
notes A character vector of explanatory text.
matrix.list A list of objects of class matrix.
verbose A logical value. If TRUE it writes out some messages.

Details

Functions to merge or combine a list of split objects.

mergeAffyBatches
Merges a list of AffyBatches to one AffyBatch.
combineMatrices
Combines a list of matrices by columns to one matrix.

Value

mergeAffyBatches Returns ONE object of class AffyBatch.
combineMatrices Returns ONE object of class matrix.

Author(s)

Markus Schmidberger schmidb@ibe.med.uni-muenchen.de, Ulrich Mansmann mansmann@ibe.med.uni-muenchen.de

Examples

library(affyPara)
if (require(affydata)) {
  data(Dilution)

  #split AffyBatch
  abatch.list<- splitAffyBatch(Dilution, 2)

  #Merge AffyBatch
  AffyBatch <- mergeAffyBatches(abatch.list)

  # Create matrices
  a <- matrix(1:25, nrow=5)
  b <- matrix(101:125, nrow=5)
  matrix.list <- list(a,b)

  # Combine matrices
  combineMatrices(matrix.list)
}

[Package affyPara version 1.2.1 Index]