setters {GenomicInteractions} | R Documentation |
Use these functions to set data stored in each of the slots of a GInteractions object.
name(GIObject) <- value interactionCounts(GIObject) <- value ## S4 replacement method for signature 'GInteractions' name(GIObject) <- value ## S4 replacement method for signature 'GInteractions,ANY' description(object) <- value ## S4 replacement method for signature 'GInteractions' interactionCounts(GIObject) <- value
GIObject |
A GenomicInteractions object |
value |
A vector to replace a slot in the object |
object |
Object, possibly derived from class |
GenomicInteractions object
library(GenomicRanges) anchor.one = GRanges(c("chr1", "chr1", "chr1", "chr1"), IRanges(c(10, 20, 30, 20), width=5)) anchor.two = GRanges(c("chr1", "chr1", "chr1", "chr2"), IRanges(c(100, 200, 300, 50), width=5)) interaction_counts = sample(1:10, 4) test <- GenomicInteractions(anchor.one, anchor.two, experiment_name="test", description="this is a test", counts=interaction_counts) name(test) <- "Mouse test" name(test) description(test) <- "This is a test using the mouse genome" description(test) interactionCounts(test) <- c(2,3,8,5) interactionCounts(test)