RCy3 2.28.1
Cytoscape is a well-known bioinformatics tool for displaying and exploring biological networks. R is a powerful programming language and environment for statistical and exploratory data analysis. RCy3 uses CyREST to communicate between R and Cytoscape, allowing any graphs (e.g., igraph, graphNEL or dataframes) to be viewed, explored and manipulated with the Cytoscape point-and-click visual interface. Thus, via RCy3, these two quite different, quite useful bioinformatics software environments are connected, mutually enhancing each other, providing new possibilities for exploring biological data.
if(!"RCy3" %in% installed.packages()){
    install.packages("BiocManager")
    BiocManager::install("RCy3")
}
library(RCy3)In addition to this package (RCy3), you will need:
First, launch Cytoscape and keep it running whenever using RCy3. Confirm that you have everything installed and running:
    cytoscapePing ()
    cytoscapeVersionInfo ()Let’s create a Cytoscape network from some basic R objects
nodes <- data.frame(id=c("node 0","node 1","node 2","node 3"),
           group=c("A","A","B","B"), # categorical strings
           score=as.integer(c(20,10,15,5)), # integers
           stringsAsFactors=FALSE)
edges <- data.frame(source=c("node 0","node 0","node 0","node 2"),
           target=c("node 1","node 2","node 3","node 3"),
           interaction=c("inhibits","interacts","activates","interacts"),  # optional
           weight=c(5.1,3.0,5.2,9.9), # numeric
           stringsAsFactors=FALSE)
createNetworkFromDataFrames(nodes,edges, title="my first network", collection="DataFrame Example")Check out the marquee style!
setVisualStyle('Marquee')Create your own style with node attribute fill mappings and some defaults
style.name = "myStyle"
defaults <- list(NODE_SHAPE="diamond",
                 NODE_SIZE=30,
                 EDGE_TRANSPARENCY=120,
                 NODE_LABEL_POSITION="W,E,c,0.00,0.00")
nodeLabels <- mapVisualProperty('node label','id','p')
nodeFills <- mapVisualProperty('node fill color','group','d',c("A","B"), c("#FF9900","#66AAAA"))
arrowShapes <- mapVisualProperty('Edge Target Arrow Shape','interaction','d',c("activates","inhibits","interacts"),c("Arrow","T","None"))
edgeWidth <- mapVisualProperty('edge width','weight','p')
createVisualStyle(style.name, defaults, list(nodeLabels,nodeFills,arrowShapes,edgeWidth))
setVisualStyle(style.name)Pro-tip: if you want to set NODE_WIDTH and NODE_HEIGHT independently, you also need to unlock the node dimensions with…
lockNodeDimensions(FALSE, style.name)Alternatively, you might want to start from a Bioconductor graphNEL object. Here we create a 4-node graph in R, send it to Cytoscape for display and layout. For the sake of simplicity, no node attributes and no visual styles are included; those topics are covered in subsequent steps.
    g = new ('graphNEL', edgemode='directed')
    g = graph::addNode ('A', g)
    g = graph::addNode ('D', g)
    g = graph::addNode ('C', g, edges = list('D'))
    g = graph::addNode ('B', g, edges = list(c('A','D','C')))
    createNetworkFromGraph (g, title='simple network', collection='GraphNEL Example')You should now have the structure of this 4-node graph with a basic, default style. Fortunately, Cytoscape has some built-in rendering rules in which (and unless instructed otherwise) nodes and edges are rendered and a default (user-preference) layout algorithm is applied.
We often know quite a lot about the nodes and edges in our graphs. By conveying this information visually, the graph will be easier to explore. For instance, we may know that protein A phosphorylates protein B, that A is a kinase and B a transcription factor, and that their mRNA expression (compared to a control) is a log2 fold change of 1.8 and 3.2 respectively. One of the core features of Cytoscape is visual styles, which allow you to specify how data values (e.g., kinase',transcription factor’; expression ratios) should be conveyed in the visual properties of the graph (e.g., node shape, node color or size).
We continue with the simple 4-node graph, adding two kinds data values (moleculeType' andlog2fc’). The easiest way to do this is via data.frames. However, you can also include attributes together with the original graph models as Bioconductor graphs, igraphs or data.frames and then use the provided create functions to create and load in a single step (see createNetworkFromGraph, createNetworkFromIgraph and createNetworkFromDataFrames functions). Check out the other vignettes for more exampls.
    df <- data.frame (moleculeType=c('kinase','TF','cytokine','cytokine'),
                     log2fc=c(1.8,3.0,-1.2,-2.5),
                     row.names = c('A','B','C','D'), # row.names = node names
                     stringsAsFactors = FALSE)       # important when loading strings!
    loadTableData (df)Note that adding the attributes does not in itself cause the appearance of the graph to change. Such a change requires that you specify and apply visual style mappings, which will be explained in the next section. You can, however, examine these attributes in Cytoscape, using Cytoscape’s the Data Panel to display data values associated with selected nodes immediately below the Cytoscape window.
RCy3 provides an easy way to not only change the default styles, but more interestingly, RCy3 also provides easy access to mapping your data to visual styles, e.g., allowing the size, shape and color of nodes and edges to be determined by the data you have associated with those nodes and edges.
First, let’s change the the defaults.
    setNodeShapeDefault ('OCTAGON')
    setNodeColorDefault ('#AAFF88')
    setNodeSizeDefault  (60)
    setNodeFontSizeDefault (30)Now we will add some visual mappings. Let’s map `moleculeType’ to node shapes. First, we can see which shapes are available in Cytoscape, then we can define the mapping with paired lists.
    getNodeShapes ()   # diamond, ellipse, trapezoid, triangle, etc.
    column <- 'moleculeType'
    values <- c ('kinase',  'TF','cytokine')
    shapes <- c ('DIAMOND', 'TRIANGLE', 'RECTANGLE')
    setNodeShapeMapping (column, values, shapes)The node shape mapping is an example of a discrete mapping, where a style is defined for each, discrete value. This is useful for categorical data (like type) where there is only a limited set of possible values. This is in contast to the other two other types of mappings: continuous and passthrough. In the case of expression values, for example, we will want to use continuous mapping (e.g., to node color), defining a small set of control points, rather than an explicit color for each possible data value. Cytoscape will simply interpolate between the control points to provide a gradient of colors. Let’s try that one now
    column <- 'log2fc'
    control.points <- c (-3.0, 0.0, 3.0)
    colors <-  c ('#5588DD', '#FFFFFF', '#DD8855')
    setNodeColorMapping (column, control.points, colors)Note that there are three colors and three control points. However, you can also specify two additional colors beyond the number of control points if you want to set extreme (or out-of-bounds) colors for values less than or greater than your control points.
    control.points <- c (-2.0, 0.0, 2.0)
    colors <-  c ('#2255CC', '#5588DD', '#FFFFFF', '#DD8855','#CC5522')
    setNodeColorMapping (column, control.points, colors)Now, add a node size rule, using log2fc again as controlling node values.
    control.points = c (-3.0, 2.0, 3.0)
    sizes     = c (20, 80, 90)
    setNodeSizeMapping (column, control.points, sizes)If you recall the third type of mapping, passthrough, we can see it already working in our current network example. The node labels! By default, the name column is mapped to the node label property using passthrough logic: the value is passed directly to the style property.
Let us now try selecting nodes in Cytoscape from R. Select the C node by name:
    selectNodes ('C','name')    getSelectedNodes ()Now we wish to extend the selected nodes to include the first neighbors of the already-selected node B. This is a common operation: for instance, after selecting one or more nodes based on experimental data or annotation, you may want to explore these in the context of interaction partners (in a protein-protein network) or in relation to upstream and downstream partners in a signaling or metabolic network. Type:
    selectFirstNeighbors ()You will see that three nodes are now selected. Get their names back to R as a list:
    node.names <- getSelectedNodes ()And, finally, deselection works as you’d expect by means of a general clearSelection function:
    clearSelection()
    ?clearSelectionSession files save everything. As with most project software, we recommend saving often!
    saveSession('vignette_session') #.cysNote: If you don’t specify a complete path, the files will be saved relative to your current working directory in R.
You can export extremely high resolution images, including vector graphic formats.
    full.path=paste(getwd(),'vignette_image',sep='/')
    exportImage(full.path, 'PNG', zoom=200) #.png scaled by 200%
    exportImage(full.path, 'PDF') #.pdf
    ?exportImageRCy3 functions
help(package=RCy3)| Category | Description | Examples | 
|---|---|---|
| Apps | Inspecting and managing apps for Cytoscape. | installApp() disableApp() getInstalledApps() | 
| Collections | Getting information about network collections. | getCollectionList() getCollectionNetworks() | 
| Commands | Constructing any arbitrary CyREST API or Commands API method via standard GET, PUT, POST and DELETE protocols. | cyrestGET() commandsPOST() cyrestAPI() commandsRun() | 
| CyNDEx | Communicating with NDEx from within Cytoscape. | importNetworkFromNDEx() exportNetworkToNDEx() | 
| Cytoscape System | Checking Cytoscape System information, including versions and memory usage. | cytoscapePing() cytoscapeVersionInfo() | 
| Filters | Selecting nodes and edges based on filter criteria. | createDegreeFilter() createColumnFilter() | 
| Groups | Working with groups in Cytoscape. | createGroup() collapseGroup() | 
| Layouts | Performing layouts in addition to getting and setting layout properties. | layoutNetwork() getLayoutNames() | 
| Networks | Creating and managing networks and retrieving information on networks, nodes and edges. | createNetworkFrom…() create…FromNetwork() getNetworkSuid(), exportNetwork() getAllNodes() getEdgeCount(), getFirstNeighbors() | 
| Network Selection | Manipulating selection of nodes and edges in networks. | selectNodes() invertNodeSelection() selectFirstNeighbors() | 
| Network Views | Performing view operations in addition to getting and setting view properties. | getCurrentView() fitContent() exportImage() toggleGraphicsDetails() | 
| Session | Managing Cytoscape sessions, including save, open and close. | openSession() saveSession() closeSession() | 
| Style Bypasses | Setting and clearing bypass values for visual properties. | setNodeColorBypass() setEdgeLineStyleBypass() hideNodes() | 
| Style Defaults | Getting and setting default values for visual properties. | setNodeShapeDefault() setEdgeLineWidthDefault() | 
| Style Dependencies | Getting and setting style dependencies. | lockNodeDimensions() | 
| Style Mappings | Defining mappings between table column values and visual properties. | mapVisualProperty() updateStyleMapping() setNodeSizeMapping() setEdgeColorMapping() | 
| Styles | Managing styles and retrieving general lists of properties relevant to multiple style modes. | createVisualStyle() setVisualStyle() exportVisualStyles() getArrowShapes() | 
| Style Values | Retrieving current values for visual properties. | getNodeWidth() getEdgeColor() getNetworkZoom() | 
| Tables | Managing table columns and table column functions, like map and rename, as well as loading and extracting table data in Cytoscape. | getTableColumns() renameTableColumn() loadTableData() mapTableColumn() | 
| Tools | Performing actions found in the Tools Menu in Cytoscape. | cybrowserDialog() diffusionBasic() | 
| User Interface | Controling the panels in the Cytoscape user interface. | hidePanel() floatPanel() dockPanel() | 
Open swagger docs for live instances of CyREST API and Commands API:
cyrestAPI()  # CyREST API
commandsAPI()  # Commands APIList available commands and arguments in R. Use “help” to list top level:
commandsHelp("help")  List network commands. Note that “help” is optional:
commandsHelp("help network")  List arguments for the network select command:
commandsHelp("help network select") That covers the basics of network manipulation. Check out the other vignettes for additional amd more complex examples. And when you are ready to work with some real data, check out the other basic and advanced R tutorials, https://github.com/cytoscape/cytoscape-automation/tree/master/for-scripters/R.
Don’t forget to check out the other vignettes in this package:
browseVignettes("RCy3")In addition, the Cytoscape team is collecting scripts from the community in a public GitHub repository at https://github.com/cytoscape/cytoscape-automation/tree/master/for-scripters/R.
The RCy3 project code and documentation is maintained at GitHub: https://github.com/cytoscape/RCy3. All bugs and feature requests are tracked as Issues, https://github.com/cytoscape/RCy3/issues.