Re: [R] igraph: layout help

2022-06-11 Thread Rui Barradas
Hello, The code below is a hack. First I create a layout ll, then see that vertex K coordinates are in the layout matrix 2nd row. Now, to multiply K's coordinates by a number d>1 will move the point away from A. Add that value to the K group and plot. ll <- layout_with_kk(my.graph) d <- ll

[R] igraph: layout help

2022-06-11 Thread Brian Smith
Hi, I was trying to make a network plot of this data: library(igraph) library(network) df1 <- data.frame(from="A",to=c("B","C","D","E","F","G"),value=1) df2 <- data.frame(from="K",to=c("L","M","N"),value=1) df3 <- data.frame(from="A",to="K",value=3) my.df <- rbind(df1,df2,df3) my.g

[R] igraph problem

2017-09-19 Thread Justin Thong
Run this code tree<-graph_from_literal(1-+2:3,3-+5,1-+4); graph.bfs(tree,root=1, neimode="out",father=TRUE,order=TRUE,unreachable = FALSE) I do not understand why the father values will give NA 1 1 3 1 rather than NA 1 1 1 3 The reason I am doing this is to obtain the values(by vertex names) or

[R] igraph -- Selecting closest neighbors

2015-10-17 Thread Michael Haenlein
Dear all, I am looking for a function to select the N closest neighbors (in terms of distance) of a vertex in igraph. Assume for example N=7. If the vertex has 3 direct neighbors, I would like that the function selects those 3 plus a random 4 among the second degree neighbors. Is there some way

Re: [R] igraph tree: increase vertex separation within tier (self-contained example)

2015-09-14 Thread Loris Bennett
Loris Bennett writes: > Hi, > > I am collecting data about network errors and would like to visualise > the results in some sort of graph which reflects the hierarchy of the > components in the network (i.e. core switches are connected to leaf > switches and nodes are connected to leaf switches).

[R] igraph tree: increase vertex separation within tier

2015-09-01 Thread Loris Bennett
Hi, I am collecting data about network errors and would like to visualise the results in some sort of graph which reflects the hierarchy of the components in the network (i.e. core switches are connected to leaf switches and nodes are connected to leaf switches). The errors are in file which look

Re: [R] igraph plot slowness

2015-08-27 Thread Loris Bennett
Loris Bennett writes: > Hi Jim, > > jim holtman writes: > >> Here is what it does locally on my PC: >> >>> library("igraph") >>> topo_data <- read.table(text = "ibcore01ibswitch01 >> + ibcore01ibswitch02 >> + ibcore01ibswitch03 >> + ibcore02ibswitch01 >> + ib

Re: [R] igraph plot slowness

2015-07-06 Thread Loris Bennett
Hi Jim, jim holtman writes: > Here is what it does locally on my PC: > >> library("igraph") >> topo_data <- read.table(text = "ibcore01ibswitch01 > + ibcore01ibswitch02 > + ibcore01ibswitch03 > + ibcore02ibswitch01 > + ibcore02ibswitch02 > + ibcore02

Re: [R] igraph plot slowness

2015-07-03 Thread jim holtman
Here is what it does locally on my PC: > library("igraph") > topo_data <- read.table(text = "ibcore01ibswitch01 + ibcore01ibswitch02 + ibcore01ibswitch03 + ibcore02ibswitch01 + ibcore02ibswitch02 + ibcore02ibswitch03 + ibswitch01 node001

[R] igraph plot slowness

2015-07-03 Thread Loris Bennett
Hi, With the following data ibcore01ibswitch01 ibcore01ibswitch02 ibcore01ibswitch03 ibcore02ibswitch01 ibcore02ibswitch02 ibcore02ibswitch03 ibswitch01 node001 ibswitch01 node002 ibswitch01 node003 ibswitch02 node004 ibswitch02

[R] [igraph] number of items to replace is not a multiple of replacement length

2014-03-26 Thread Mark Stam
I wrote a simple script to build graphs: require("RSQLite") require('igraph') drv <- dbDriver("SQLite") con <- dbConnect(drv, "case.db") dataset <- dbGetQuery(con, "select * from stream") table <- aggregate(rep(1, nrow(dataset)), by = list(identifier = dataset$actor_id, name = dataset$actor, page

Re: [R] igraph vertex.label.font sans serif

2013-08-20 Thread Witold E Wolski
recall. it's: vertex.label.family sorry On 20 August 2013 17:30, Witold E Wolski wrote: > Would like to plot vertex labels without serif. > there is vertex.label.font param but he lets me choose only between > one font type in normal bold and emph. > > any suggestions welcome. > > > -- > Witold

[R] igraph vertex.label.font sans serif

2013-08-20 Thread Witold E Wolski
Would like to plot vertex labels without serif. there is vertex.label.font param but he lets me choose only between one font type in normal bold and emph. any suggestions welcome. -- Witold Eryk Wolski __ R-help@r-project.org mailing list https://sta

[R] [igraph] Counting edges for each vertex

2013-06-15 Thread Mulone
Hi all, I'm analysing an e-mail network. I loaded the following information in a directed igraph: *Vertex* types: person, e-mail V(g)[ type == "person" ] V(g)[ type == "email" ] *Edge* types: sends, receives E(g)[ type == "send" ] E(g)[ type == "receive" ] So for example: John --send--> email1

Re: [R] igraph: Turn multiple edges into weights

2012-08-15 Thread Gábor Csárdi
On Tue, Aug 14, 2012 at 5:09 PM, Jonas Michaelis wrote: > Dear all, > > > I have some network data - about 300 vertices and several thousand edges. I > am looking for a way to turn multiple edges into weights of the edges. I > looked around and - surprisingly? - haven't found anything. Is there an

Re: [R] [igraph] per-vertex statistics of edge weights

2012-08-15 Thread Gábor Csárdi
On Wed, Aug 15, 2012 at 4:10 PM, Sam Steingold wrote: [...] > Also, this takes forever and consumes almost all 8GB RAM. > It has been running on > > --8<---cut here---start->8--- > IGRAPH DNW- 18590 6734992 -- > + attr: name (v/c), count (v/n), weight (e/n) > --

Re: [R] igraph: Turn multiple edges into weights

2012-08-15 Thread Rui Barradas
Hello, There is a function count.multiple that can be used to do what you want. You can also have a function return unique rows/edges. Here are three functions that count multiple edges. library(igraph) ee <- c(1,2,2,3,1,2,2,4,1,2,2,3) g <- graph(ee) plot(g) # Returns a two column matrix w

[R] igraph: Turn multiple edges into weights

2012-08-14 Thread Jonas Michaelis
Dear all, I have some network data - about 300 vertices and several thousand edges. I am looking for a way to turn multiple edges into weights of the edges. I looked around and - surprisingly? - haven't found anything. Is there an easy way to do this? Best, Jonas [[alternative HTML ver

[R] igraph node placement

2012-07-23 Thread Steven Wolf
Hello R users, I've just defended my PhD dissertation, and I'm engaging in discussions with the "ruler lady". She has some problems with my figures. The problem is that my nodes overlap the text that I've put inside of them. Here is a url for the figure: https://www.msu.edu/~wolfste4/igr

Re: [R] igraph function "graph.bfs" unavailable

2012-07-12 Thread David Marx
Marx Cc: r-help@r-project.org Subject: Re: [R] igraph function "graph.bfs" unavailable Hi David, please make sure that you have the 0.6 version of igraph installed. You might need to upgrade your R installation to install the 0.6 version of igraph. Best, Gabor On Wed, Jul 11, 2012 a

Re: [R] igraph function "graph.bfs" unavailable

2012-07-12 Thread Gábor Csárdi
Hi David, please make sure that you have the 0.6 version of igraph installed. You might need to upgrade your R installation to install the 0.6 version of igraph. Best, Gabor On Wed, Jul 11, 2012 at 10:36 AM, David Marx wrote: > Hi, > > I've installed the igraph package and have been otherwise u

[R] igraph function "graph.bfs" unavailable

2012-07-11 Thread David Marx
Hi, I've installed the igraph package and have been otherwise using it successfully, but when I try to use graph.bfs I get the error: could not find function "graph.bfs" Moreover, I don't seem to have the documentation installed either. (per ?graph.bfs and ??graph.bfs). I'm using RStudio

Re: [R] igraph and igraph0

2012-06-04 Thread Gábor Csárdi
On Sat, Jun 2, 2012 at 9:58 AM, jalantho...@verizon.net wrote: > Could someone tell me the difference between igraph and igraph0? > > I searched the CRAN web site, but cannot find an explantion of the > differences. You are right that this should be in the package description. There is no diffe

[R] igraph and igraph0

2012-06-02 Thread jalantho...@verizon.net
Could someone tell me the difference between igraph and igraph0? I searched the CRAN web site, but cannot find an explantion of the differences. Thanks, Alan [[alternative HTML version deleted]] __ R-help@r-project.org mailing list https://st

Re: [R] igraph: decompose.graph: Error: protect(): protection stack overflow

2012-03-20 Thread Duncan Murdoch
On 12-03-20 2:20 PM, Sam Steingold wrote: I just got this error: library(igraph) comp<- decompose.graph(gr) Error: protect(): protection stack overflow Error: protect(): protection stack overflow what can I do? the digraph is, indeed, large (300,000 vertexes), but there are very many very s

Re: [R] igraph: decompose.graph: Error: protect(): protection stack overflow

2012-03-20 Thread Sam Steingold
> * Sam Steingold [2012-03-20 14:20:06 -0400]: > > I just got this error: >> library(igraph) >> comp <- decompose.graph(gr) > Error: protect(): protection stack overflow > Error: protect(): protection stack overflow >> after restarting > system.time(comp <- decompose.graph(gr, mode="weak")) Err

[R] igraph: decompose.graph: Error: protect(): protection stack overflow

2012-03-20 Thread Sam Steingold
I just got this error: > library(igraph) > comp <- decompose.graph(gr) Error: protect(): protection stack overflow Error: protect(): protection stack overflow > what can I do? the digraph is, indeed, large (300,000 vertexes), but there are very many very small components (which I would rather not

[R] igraph find the path with the smallest weights

2012-02-28 Thread Wendy
Hi all, I am trying to analyze some graphs in R. Given a weighted directed network with 7 nodes. I want to find a path from node 1 to node 7, so the sum of all the edges on the path is the smallest comparing to all the other paths. I am wondering if I can do this in igraph. After I identify the p

[R] igraph question

2012-01-16 Thread TomR
Hi List, I have a set of small graphs with weighted and directed edges (< 40 vertices each). As igraph's 'transitivity' function ignores the edge weight & direction, I wonder if there's any method for estimating the global clustering coefficient for such graphs..? Cheers, Tom -- View this me

Re: [R] igraph - designing graph plot by attributes

2011-08-18 Thread Gábor Csárdi
Create a factor variable for the different age categories, see cut(). Then use as.integer() on the factor variable and index a vector of node sizes with it. E.g. g <- graph.ring(10) V(g)$age <- sample(20:78, vcount(g), replace=TRUE) V(g)$agecat <- cut(V(g)$age, breaks = c(20,35,50,65,78)) V(g)$siz

[R] igraph - designing graph plot by attributes

2011-08-10 Thread Gaitan, Andreea
Hi, I'm working on some social networks and I managed to create the graphs with labels and edges weight, but I would also like to change the size of the vertices according to the age of the persons in the network and the shape according to the gender. Now for the age, I have people with ages be

[R] igraph package question

2011-01-27 Thread Yan Jiao
Dear R users, I'm using igraph package for clustering, just wondering is leading.eigenvector.community function result deterministic or not? I got slightly different results on different runs... Many thanks Yan ***

[R] igraph / eigenvector centrality score

2010-09-30 Thread ricovaglio
Hi to all, I have two graphs with the same number of nodes but with different connectivities and also with a different number of clusters. The two graphs represent the same "system" under different "conditions" and then there is a one-to-one correspondence between a given node in the two graphs. I

[R] igraph, graph layout and node overlaps

2010-09-10 Thread anfel
Dear all, I'm doing some experiments with igraph and in particular with graph layouts. I can't figure out how to apply a layout to a given (real) graph avoiding node overlaps. In the following example if the variable NumOfNodes is setted to a small value (10) the layout function generates a plot

Re: [R] igraph

2010-02-16 Thread Paul Murrell
Hi gabrielap wrote: Hello... I am a system engeenering student and I am using R for first time for Graph Theory. I would like to know if there is anyway you can plot an ghaph (igraph library) and obtain a graph whose vertices dont appear identified with number, instead I would like the ve

[R] igraph

2010-02-11 Thread gabrielap
Hello... I am a system engeenering student and I am using R for first time for Graph Theory. I would like to know if there is anyway you can plot an ghaph (igraph library) and obtain a graph whose vertices dont appear identified with number, instead I would like the vertices to be identified

Re: [R] igraph plot - vertex colors

2009-12-08 Thread Jakson A. Aquino
On Sun, Dec 06, 2009 at 04:34:18PM -0800, Brock Tibert wrote: > I have successfully created and analyzed my network data. I am > new to R, and Network Analysis too, but I want to color my > vertex based on some of the centrality measures calculated. > > Can someone point me in the right directi

[R] igraph plot - vertex colors

2009-12-06 Thread Brock Tibert
Hi everyone, I have successfully created and analyzed my network data. I am new to R, and Network Analysis too, but I want to color my vertex based on some of the centrality measures calculated. Can someone point me in the right direction? Again, I am new to R, but given how powerful R appe

Re: [R] R igraph clusters component

2009-12-04 Thread Gábor Csárdi
Hi, On Fri, Dec 4, 2009 at 3:12 AM, Gaurav Kumar wrote: > Hi R-users, > > I'm using igraph for an undirected graph. > i used clusters() igraph function to know the component size(subgraphs) as > shown bellow: > c <-clusters(g) > # component sizes > size <- sort(c$csize, decreasing=TRUE) > cat("T

[R] R igraph clusters component

2009-12-03 Thread Gaurav Kumar
Hi R-users, I'm using igraph for an undirected graph. i used clusters() igraph function to know the component size(subgraphs) as shown bellow: c <-clusters(g)    # component sizes size <- sort(c$csize, decreasing=TRUE) cat("Top 20 cluster of the graph","\n") for (i in 1:20) {   cat(i,"  size:",s

Re: [R] Igraph: family 'serif' not included in PostScript device

2009-04-16 Thread Gábor Csárdi
Knut, see this thread here: http://lists.gnu.org/archive/html/igraph-help/2007-07/msg00010.html Best, Gabor On Thu, Apr 16, 2009 at 10:03 AM, Knut Krueger wrote: > Does anybody know how to solve this error? > > postscript(file= "file.ps", family = "Helvetica", font = "Helvetica") > plot.igraph(g

[R] Igraph: family 'serif' not included in PostScript device

2009-04-16 Thread Knut Krueger
Does anybody know how to solve this error? postscript(file= "file.ps", family = "Helvetica", font = "Helvetica") plot.igraph(g, layout=layout.circle, vertex.label.font=2) dev.off() error in text.default(x, y, labels = labels, col = label.color, family = label.family, : family 'serif' not inc

Re: [R] igraph: error when setting size and shape of vertices

2009-02-04 Thread Gábor Csárdi
Yep, this is a bug, thanks for reporting it. It only happens with the square shape, so until it is a corrected, a workaround is using "rectangle" shape, with equal vertical and horizontal sizes: g <- graph.ring(4) g$layout <- layout.circle V(g)$size <- seq_len(vcount(g)) * 10 V(g)$size2 <- V(g)$si

[R] igraph: error when setting size and shape of vertices

2009-02-04 Thread robbie . heremans
When the shape of all vertices is set to "square" and the size of the vertices is also set, one get following error (commands attached): Error in l[[which.min(sapply(l, function(p) (p[1] - x0)^2 + (p[2] - y0)^2))]] : attempt to select less than one element Is there a way to solve this pr

Re: [R] igraph rglplot SVD-layout

2008-11-17 Thread Gábor Csárdi
Rainer, here is a quick workaround: layout.svd3 <- function (graph, d = shortest.paths(graph), ...) { if (!is.igraph(graph)) { stop("Not a graph object") } l <- svd(d, 3)$u l[, 1] <- l[, 1]/dist(range(l[, 1])) l[, 2] <- l[, 2]/dist(range(l[, 2])) l[, 3] <- l[, 3]/dist(range(l[, 3]

[R] igraph rglplot SVD-layout

2008-11-17 Thread Rainer Tischler
The layout.svd-function in the igraph-package seems to support only two-dimensional layouts currently. Is anybody aware of a workaround to obtain the coordinate-values for the third dimension? (And by the way, is it possible to change the background-color in rglplots?) I'm using the R-2.6.2 vers

Re: [R] igraph and tkgraph

2008-11-16 Thread Gábor Csárdi
On Sun, Nov 16, 2008 at 7:14 PM, Tom Backer Johnsen <[EMAIL PROTECTED]> wrote: > Gábor Csárdi wrote: >> >> On Sun, Nov 16, 2008 at 3:01 PM, Gábor Csárdi <[EMAIL PROTECTED]> >> wrote: >>> >>> Tom, >>> >>> On Fri, Nov 14, 2008 at 4:35 PM, Tom Backer Johnsen <[EMAIL PROTECTED]> >>> wrote: >> >> [...]

Re: [R] igraph and tkgraph

2008-11-16 Thread Tom Backer Johnsen
Gábor Csárdi wrote: On Sun, Nov 16, 2008 at 3:01 PM, Gábor Csárdi <[EMAIL PROTECTED]> wrote: Tom, On Fri, Nov 14, 2008 at 4:35 PM, Tom Backer Johnsen <[EMAIL PROTECTED]> wrote: [...] suspicion that if the relations between two vertices is non-symmetric, only one of the is shown. Is it possib

Re: [R] igraph and tkgraph

2008-11-16 Thread Tom Backer Johnsen
Gábor Csárdi wrote: On Sun, Nov 16, 2008 at 3:01 PM, Gábor Csárdi <[EMAIL PROTECTED]> wrote: Tom, On Fri, Nov 14, 2008 at 4:35 PM, Tom Backer Johnsen <[EMAIL PROTECTED]> wrote: [...] suspicion that if the relations between two vertices is non-symmetric, only one of the is shown. Is it possib

Re: [R] igraph and tkgraph

2008-11-16 Thread Tom Backer Johnsen
Gábor Csárdi wrote: Tom, On Fri, Nov 14, 2008 at 4:35 PM, Tom Backer Johnsen <[EMAIL PROTECTED]> wrote: Gabor: Actually, I meant a script GUI management of ugraph I managed to locate on the net. Oh, ok, it will be part of igraph from the next version. But its capabilities are very limited. W

Re: [R] igraph and tkgraph

2008-11-16 Thread Gábor Csárdi
On Sun, Nov 16, 2008 at 3:01 PM, Gábor Csárdi <[EMAIL PROTECTED]> wrote: > Tom, > > On Fri, Nov 14, 2008 at 4:35 PM, Tom Backer Johnsen <[EMAIL PROTECTED]> wrote: [...] >> suspicion that if the relations between two vertices is non-symmetric, only >> one of the is shown. Is it possible to have a p

Re: [R] igraph and tkgraph

2008-11-16 Thread Gábor Csárdi
Tom, On Fri, Nov 14, 2008 at 4:35 PM, Tom Backer Johnsen <[EMAIL PROTECTED]> wrote: > Gabor: > > Actually, I meant a script GUI management of ugraph I managed to locate on > the net. Oh, ok, it will be part of igraph from the next version. But its capabilities are very limited. We are considering

Re: [R] igraph and tkgraph

2008-11-14 Thread Tom Backer Johnsen
Gabor: Actually, I meant a script GUI management of ugraph I managed to locate on the net. Disregarding that, thank you for the suggestions. igraph is definitly a non-trivial affair, with a lot of options and corresponding flexibility. I made some changes to what you wrote: A <- matrix(sa

Re: [R] igraph and tkgraph

2008-11-14 Thread Gábor Csárdi
Tom, you mean 'tkplot' in the igraph package? Look at ?igraph.plotting on how to set up plotting parameters, e.g. if you want different line types for the positive/negative relations, then you can make use of the 'lty' parameter: A <- matrix(sample(c(-1,0,1), 100, replace=TRUE), 10) g <- graph.adj

[R] igraph and tkgraph

2008-11-14 Thread Tom Backer Johnsen
I have a number of (directed) graphs based on social groups, where the members have expresed likes and dislikes in respect to the other members. tkgraph makes it simple to draw the graphs in a very pleasing way, but I would like to differentiate between positive and negative relations in the g

Re: [R] Igraph library: How to calculate APSP (shortest path matrix) matrix for a subset list of nodes.

2008-08-25 Thread Csardi Gabor
rote: > > > From: Moshe Olshansky <[EMAIL PROTECTED]> > > Subject: Re: [R] Igraph library: How to calculate APSP (shortest path > > matrix) matrix for a subset list of nodes. > > To: r-help@r-project.org, "dinesh kumar" <[EMAIL PROTECTED]> > &g

Re: [R] Igraph library: How to calculate APSP (shortest path matrix) matrix for a subset list of nodes.

2008-08-24 Thread Moshe Olshansky
I was too optimistic - the complexity is O(E*log(V)) where V is the number of nodes, but since log(25000) < 20 this is still reasonable. --- On Mon, 25/8/08, Moshe Olshansky <[EMAIL PROTECTED]> wrote: > From: Moshe Olshansky <[EMAIL PROTECTED]> > Subject: Re: [R] I

Re: [R] Igraph library: How to calculate APSP (shortest path matrix) matrix for a subset list of nodes.

2008-08-24 Thread Moshe Olshansky
require about 100,000*500 = 50,000,000 operations (times a small factor) which is very reasonable. --- On Mon, 25/8/08, dinesh kumar <[EMAIL PROTECTED]> wrote: > From: dinesh kumar <[EMAIL PROTECTED]> > Subject: [R] Igraph library: How to calculate APSP (shortest path matri

[R] Igraph library: How to calculate APSP (shortest path matrix) matrix for a subset list of nodes.

2008-08-24 Thread dinesh kumar
Dear R Users, I have a network of 25000 total nodes and a list of 500 node which is a subset of all nodes. Now I want to calculate the APSP (all pair shortest path) matrix only for these 500 nodes. I would appreciate any help. Thanks in advance Dinesh -- Dinesh Kumar Barupal Research Associate

Re: [R] igraph (was Compilation error during package installation)

2008-06-27 Thread Gabor Csardi
Wanding, I'm the maintainer of igraph, but missed your previous email. Yes, currently the released version of igraph fails to compile with gcc 4.3.x. I made the required modifications to fix this, but these are still in the igraph development tree, as there has been no release since that. Yo

Re: [R] igraph (was Compilation error during package installation)

2008-06-27 Thread Prof Brian Ripley
Please discuss this with the package maintainer (see the posting guide). He will need lots of details you have omitted, including the precise OS and the C++ compiler used. BTW, this illustrates a common problem with packages using C++, which people often test only under one compiler, and unti

Re: [R] igraph and plotting connected components

2007-10-09 Thread Gabor Csardi
Dieter, there are a couple of ways to do this in igraph, eg. you can decompose the graph into separate components with g <- erdos.renyi.game(100, 1/100) graphs <- decompose.graph(g) and then you will have a list of graphs. If you assign some vertex ids as vertex attributes then you can keep tra

Re: [R] igraph and plotting connected components

2007-10-09 Thread Gabor Csardi
On Mon, Oct 08, 2007 at 08:11:16PM -0500, [EMAIL PROTECTED] wrote: [...] > Dot-file format is also *ridiculously simple* to generate , which I think > of as a factor well in its favor. :-) This is just write.graph(g, format="dot", file="output.dot") in igraph. > I hear that there's a tk-based

Re: [R] igraph and plotting connected components

2007-10-08 Thread elw
>> Hello there, >> >> I am using the igraph package to build graphs from my data. If I plot >> a graph though, it's not easy for me to see what's going on. Does >> anybody know how to rearrange a graph to get a plot without too many >> crossing lines? Maybe other packages? Edge-crossing mi

Re: [R] igraph and plotting connected components

2007-10-08 Thread Duncan Murdoch
On 08/10/2007 8:27 PM, Dieter Best wrote: > Hello there, > > I am using the igraph package to build graphs from my data. If I plot a > graph though, it's not easy for me to see what's going on. Does anybody know > how to rearrange a graph to get a plot without too many crossing lines? Maybe

Re: [R] igraph and plotting connected components

2007-10-08 Thread Robert Gentleman
graph, RBGL and Rgraphviz, all available at www.bioconductor.org Dieter Best wrote: > Hello there, > > I am using the igraph package to build graphs from my data. If I plot a > graph though, it's not easy for me to see what's going on. Does anybody know > how to rearrange a graph to get a

[R] igraph and plotting connected components

2007-10-08 Thread Dieter Best
Hello there, I am using the igraph package to build graphs from my data. If I plot a graph though, it's not easy for me to see what's going on. Does anybody know how to rearrange a graph to get a plot without too many crossing lines? Maybe other packages? Thanks a lot in advance for