Hello,
First of all, thank you for using our tool - we highly appreacite it.
About your issue, you can fix it by taking the sub-graph as an igraph object and use its plotting arguments.
You can play with pretty much every graphical attribute, I have attached an example.
# example on how to customise the plotting attributes of the sub-graph
library(igraph)
library(FELLA)
data("FELLA.sample")
data("input.sample")
myAnalysis <- enrich(
compounds = input.sample,
method = "diffusion",
approx = "normality",
data = FELLA.sample)
# default plotting
plot(myAnalysis, method = "diffusion", data = FELLA.sample)
# export the graph
g <- generateResultsGraph(object = myAnalysis, data = FELLA.sample)
# again, default plotting
plotGraph(g)
# custom plotting
# currently there is no way to get the default parameters for the graph
# and change them - would be a nice improvement to allow it
#
# see ?igraph.plotting for a list of options
v.size <- c(
"1" = 10,
"2" = 6,
"3" = 5,
"4" = 4,
"5" = 2
)
v.color <- stats::setNames(grDevices::palette()[1:5], 1:5)
plot(g,
vertex.size = v.size[V(g)$com],
vertex.color = v.color[V(g)$com],
vertex.label.dist = 1,
vertex.label.color = ifelse(V(g)$name %in% input.sample,
"indianred1", "gray20"),
edge.curved = TRUE,
edge.width = 3)
Of course, you can also export it to other data formats or use other visualisers (e.g. visNetwork).
In the next release, we might try to make it easier to do within FELLA, i.e. not requiring to resort to igraph.
Hope it helps