]> AND Private Git Repository - loba-papers.git/blobdiff - loba-besteffort/data/script.r
Logo AND Algorithmique Numérique Distribuée

Private GIT Repository
Improve legends.
[loba-papers.git] / loba-besteffort / data / script.r
index 68d78a90b79980bd6f8d0d4ee7cb359587e82af4..a4f7e3bb5ef5aeb309420e41b0e0efae43d378f9 100644 (file)
@@ -126,7 +126,16 @@ draw2 <- function(dset = ds,
                        idvar="Algo", timevar="Size")
 
   ## rename rows
-  rownames(dset.wide) <- sub("bookkeeping", "virtual", dset.wide$Algo)
+  names <- dset.wide$Algo
+  names <- sub("makhoul_plain",             "a: makhoul,plain", names)
+  names <- sub("besteffort_plain",          "b: best effort,plain", names)
+  names <- sub("besteffort-k2_plain",       "c: best effort,k=2,plain", names)
+  names <- sub("besteffort-k4_plain",       "d: best effort,k=4,plain", names)
+  names <- sub("makhoul_bookkeeping",       "e: makhoul,virtual", names)
+  names <- sub("besteffort_bookkeeping",    "f: best effort,virtual", names)
+  names <- sub("besteffort-k2_bookkeeping", "g: best effort,k=2,virtual", names)
+  names <- sub("besteffort-k4_bookkeeping", "h: best effort,k=4,virtual", names)
+  rownames(dset.wide) <- names
   #colnames(dset.wide) <- sub("^[^.]*\\.", "", colnames(dset.wide))
 
   ## remove first column (aka "Algo")
@@ -135,7 +144,8 @@ draw2 <- function(dset = ds,
 
   dset.plot <- dset.mat[, c(FALSE,FALSE,TRUE)]
   barplot(dset.plot, beside=TRUE,
-          names.arg=sub("^[^.]*\\.", "", colnames(dset.plot)),
+          axisnames=FALSE,
+#          names.arg=sub("^[^.]*\\.", "", colnames(dset.plot)),
           col=gray.colors(nc)
 #          col=rainbow(nc, s=.5)
           )
@@ -144,7 +154,7 @@ draw2 <- function(dset = ds,
   barplot(dset.plot, beside=TRUE,
           axes=FALSE, axisnames=FALSE, add=TRUE,
           legend.text=TRUE,
-          args.legend=list(x="topleft", inset=c(.02,0), title="Algorithms"),
+          args.legend=list(x="topleft", inset=c(.02,0), x.intersp=0.5, title="Algorithms"),
           col=gray.colors(nc)
 #          col=rainbow(nc)
           )
@@ -153,10 +163,22 @@ draw2 <- function(dset = ds,
   barplot(dset.plot, beside=TRUE,
           axes=FALSE, axisnames=FALSE, add=TRUE,
           col="white"
+#          col=gray.colors(nc)
 #          col=rainbow(nc, v=.5)
           )
 
   ## finally, set titles
+  c <- ncol(dset.plot) - 1
+  for (l in 0:7) {
+    t <- intToUtf8(utf8ToInt("a") + l)
+    for (a in 1.5 + l + 9 * 0:c)
+      mtext(t, side=1, at=a)
+  }
+  a=5
+  for (s in sub("^[^.]*\\.", "", colnames(dset.plot))) {
+    mtext(s, side=1, line=1.5, at=a)
+    a <- a + 9
+  }
   t <- paste0(dset$Mode[1], dset$Distrib[1], " / ",
               dset$Ratio[1], " / ",
               dset$Platform[1], " / ", dset$Topo[1])
@@ -166,53 +188,60 @@ draw2 <- function(dset = ds,
 
 }
 
-msg <- function(text,
-                wait = TRUE) {
-  if (wait)
-    readline("Press <Enter> to continue\n")
-  message(text)
-}
-
 if (FALSE) {
-msg("First test, with algorithms \"plain\"...", wait = FALSE);
-draw(subset(ds, grepl("[lt]_plain", Algo)), draw_distrib="N")
 
-msg("... with draw2()...")
-draw2(subset(ds, grepl("[lt]_plain", Algo)), draw_distrib="N")
+  if (TRUE) {
+    draw2(draw_distrib="1")
+    draw2(draw_distrib="N")
+  } else {
+    msg <- function(text, wait = TRUE) {
+      if (wait)
+        readline("Press <Enter> to continue\n")
+      message(text)
+    }
 
-msg("Second test, with algorithms \"bookkeeping\"...");
-draw(subset(ds, grepl("[lt]_bookkeeping", Algo)), draw_distrib="N")
+    msg("First test, with algorithms \"plain\"...", wait = FALSE);
+    draw(subset(ds, grepl("[lt]_plain", Algo)), draw_distrib="N")
 
-msg("... with draw2()...")
-draw2(subset(ds, grepl("[lt]_bookkeeping", Algo)), draw_distrib="N")
+    msg("... with draw2()...")
+    draw2(subset(ds, grepl("[lt]_plain", Algo)), draw_distrib="N")
 
-msg("Third test, with all algorithms...");
-draw(draw_distrib="N")
+    msg("Second test, with algorithms \"bookkeeping\"...");
+    draw(subset(ds, grepl("[lt]_bookkeeping", Algo)), draw_distrib="N")
 
-msg("... with draw2()...")
-draw2(draw_distrib="N")
-}
+    msg("... with draw2()...")
+    draw2(subset(ds, grepl("[lt]_bookkeeping", Algo)), draw_distrib="N")
 
-pdf.options(colormodel="grey")
-system("mkdir -pv graphs")
-for (m in c("R", "I")) {
-  for (d in c("1", "N")) {
-    for (r in c("10:1", "1:1", "1:10")) {
-      for (t in c("line", "torus", "hcube")) {
-        for (p in c("grid", "cluster")) {
-          message(sprintf(">>> Drawing: %s%s / %s / %s / %s", m, d, r, p, t))
+    msg("Third test, with all algorithms...");
+    draw(draw_distrib="N")
+
+    msg("... with draw2()...")
+    draw2(draw_distrib="N")
+  }
+
+} else {
+
+  pdf.options(colormodel="grey")
+  system("mkdir -pv graphs")
+  for (m in c("R", "I")) {
+    for (d in c("1", "N")) {
+      for (r in c("10:1", "1:1", "1:10")) {
+        for (t in c("line", "torus", "hcube")) {
+          for (p in c("grid", "cluster")) {
+            message(sprintf(">>> Drawing: %s%s / %s / %s / %s", m, d, r, p, t))
           filename <- sprintf("graphs/%s%s-%s-%s-%s.pdf", m, d, r, p, t)
-          pdf(file=filename)
-          draw2(#subset(ds, grepl("[lt]_plain", Algo)),
-                draw_mode=m, draw_distrib=d, draw_ratio=r,
-                draw_topo=t, draw_platform=p)
-          dev.off()
-          embedFonts(file=filename, options="-dPDFSETTINGS=/prepress")
+            pdf(file=filename)
+            draw2(#subset(ds, grepl("[lt]_plain", Algo)),
+                  draw_mode=m, draw_distrib=d, draw_ratio=r,
+                  draw_topo=t, draw_platform=p)
+            dev.off()
+            embedFonts(file=filename, options="-dPDFSETTINGS=/prepress")
+          }
         }
       }
     }
   }
-}
 
-## restore default options
-options(scipen=osp)
+  ## restore default options
+  options(scipen=osp)
+}