| channelHeatmap {IONiseR} | R Documentation |
Creates a plot representing the layout of a MinION flow cell. Each circle
represents an individual channel with the intensity relecting a specified
sequencing metric. This function is a more generalised version of
layoutPlot, allowing the user to map any value the like on
the channel layout.
channelHeatmap(data, zValue)
data |
A data.frame. Should have at least two columns, one of which has the name 'channel'. |
zValue |
Character string specifying the name of the column to be used for the colour scaling. |
Returns an object of gg representing the plot.
library(dplyr)
if( require(minionSummaryData) ) {
data(s.typhi.rep2, package = 'minionSummaryData')
## calculate and plot the mean number of events recorded by each channel
avgEvents <- left_join(readInfo(s.typhi.rep2), eventData(s.typhi.rep2), by = 'id') %>%
group_by(channel) %>%
summarise(mean_nevents = mean(num_events))
channelHeatmap(avgEvents, zValue = 'mean_nevents')
}