RowDataTable-class {iSEE} | R Documentation |
The RowDataTable is a panel class for creating a ColumnTable where the value of the table is defined as the rowData
of the SummarizedExperiment.
This class inherits all slots from its parent ColumnTable and Table classes.
RowDataTable(...)
creates an instance of a RowDataTable class, where any slot and its value can be passed to ...
as a named argument.
Note that ColSearch
should be a character vector of length equal to the total number of columns in the rowData
, though only the entries for the atomic fields will actually be used.
In the following code snippets, x
is an instance of a RowDataTable class.
Refer to the documentation for each method for more details on the remaining arguments.
For setting up data values:
.cacheCommonInfo(x)
adds a "RowDataTable"
entry containing valid.rowData.names
, a character vector of names of atomic columns of the rowData
.
This will also call the equivalent ColumnTable method.
.refineParameters(x, se)
adjusts ColSearch
to a character vector of length equal to the number of atomic fields in the rowData
.
This will also call the equivalent ColumnTable method for further refinements to x
.
For defining the interface:
.hideInterface(x, field)
returns TRUE
if field="DataBoxOpen"
,
otherwise it calls .hideInterface,Table-method
.panelColor(x)
will return the specified default color for this panel class.
For defining the panel name:
.fullName(x)
will return "Row data table"
.
For creating the output:
.generateTable(x, envir)
will modify envir
to contain the relevant data.frame for display,
while returning a character vector of commands required to produce that data.frame.
Each row of the data.frame should correspond to a row of the SummarizedExperiment.
Aaron Lun
################# # For end-users # ################# x <- RowDataTable() x[["Selected"]] x[["Selected"]] <- "SOME_ROW_NAME" ################## # For developers # ################## library(scater) sce <- mockSCE() # Sets the search columns appropriately. sce <- .cacheCommonInfo(x, sce) .refineParameters(x, sce)