Back to the "Multiple platform build/check report"

NOTES: (1) a maintainance reboot of lemming prevented these builds to complete on this machine (2) these are the last builds with R 2.6.0 (2007-06-03 r41797) on lamb1 and lemming, next builds will be with R 2.6.0 (2007-06-10 r41908) configured with --enable-strict-barrier
Package 32/238HostnameOSArchBUILDCHECKBUILD BIN

biocGraph

0.0.2

Li Long
Last Changed Date: 2007-05-11 21:56:41 -0700
Last Changed Rev: 24616
lamb1 Linux (SUSE 10.1) x86_64  OK  OK 
wellington Linux (SUSE 9.2) i686  OK  OK 
churchill Solaris 2.9 sparc [ ERROR ]skipped
lemming Windows Server 2003 (32-bit) x64  OK  OK skipped
Package: biocGraph
Version: 0.0.2
Command: /loc/biocbuild/bbs-2.1-bioc/R/bin/R CMD build biocGraph
RetCode: 1
Time: 40.3 seconds
Status: ERROR
PackageFile: None

Command output

* checking for file 'biocGraph/DESCRIPTION' ... OK
* preparing 'biocGraph':
* checking DESCRIPTION meta-information ... OK
* installing the package to re-build vignettes
* Installing *source* package 'biocGraph' ...
** R
** inst
** preparing package for lazy loading
Loading required package: graph
Loading required package: geneplotter
Loading required package: annotate
Loading required package: Biobase
Loading required package: tools

Welcome to Bioconductor

  Vignettes contain introductory material. To view, type
  'openVignette()'. To cite Bioconductor, see
  'citation("Biobase")' and for packages 'citation(pkgname)'.

Loading required package: AnnotationDbi
Loading required package: DBI
Loading required package: RSQLite
Loading required package: lattice
KernSmooth 2.22 installed
Copyright M. P. Wand 1997
Loading required package: Rgraphviz

Attaching package: 'Rgraphviz'


	The following object(s) are masked from package:annotate :

	 toFile 

Loading required package: fibroEset
Loading required package: hgu95av2
** help
 >>> Building/Updating help pages for package 'biocGraph'
     Formats: text html latex example 
  imageMap                          text    html    latex   example
** building package indices ...
* DONE (biocGraph)
* creating vignettes ...Bus Error - core dumped
 ERROR
Loading required package: graph
Loading required package: geneplotter
Loading required package: annotate
Loading required package: Biobase

Welcome to Bioconductor

  Vignettes contain introductory material. To view, type
  'openVignette()'. To cite Bioconductor, see
  'citation("Biobase")' and for packages 'citation(pkgname)'.

Loading required package: AnnotationDbi
Loading required package: DBI
Loading required package: RSQLite
Loading required package: lattice
KernSmooth 2.22 installed
Copyright M. P. Wand 1997
Loading required package: Rgraphviz

Attaching package: 'Rgraphviz'


	The following object(s) are masked from package:annotate :

	 toFile 

Loading required package: fibroEset
Loading required package: hgu95av2

 *** caught bus error ***
address 1596a5c, cause 'invalid alignment'

Traceback:
 1: .Call("Rgraphviz_buildEdgeList", aa, edgemode(graph), subGList,     edgeNames, removed, edgeAttrs, defAttrs, PACKAGE = "Rgraphviz")
 2: buildEdgeList(graph, recipEdges, edgeAttrs, subGList, attrs$edge)
 3: agopen(x, name = name, layout = TRUE, layoutType = y, attrs = attrs,     nodeAttrs = nodeAttrs, edgeAttrs = edgeAttrs, subGList = subGList,     recipEdges = recipEdges)
 4: .local(x, y, ...)
 5: plot(z, nodeAttrs = nA)
 6: plot(z, nodeAttrs = nA)
 7: eval.with.vis(expr, .GlobalEnv, baseenv())
 8: doTryCatch(return(expr), name, parentenv, handler)
 9: tryCatchOne(expr, names, parentenv, handlers[[1]])
10: tryCatchList(expr, classes, parentenv, handlers)
11: tryCatch(expr, error = function(e) {    call <- conditionCall(e)    if (!is.null(call)) {        if (identical(call[[1]], quote(doTryCatch)))             call <- sys.call(-4)        dcall <- deparse(call)[1]        prefix <- paste("Error in", dcall, ": ")        LONG <- 75        msg <- conditionMessage(e)        sm <- strsplit(msg, "\n")[[1]]        if (14 + nchar(dcall, type = "w") + nchar(sm[1], type = "w") >             LONG)             prefix <- paste(prefix, "\n  ", sep = "")    }    else prefix <- "Error : "    msg <- paste(prefix, conditionMessage(e), "\n", sep = "")    .Internal(seterrmessage(msg[1]))    if (!silent && identical(getOption("show.error.messages"),         TRUE)) {        cat(msg, file = stderr())        .Internal(printDeferredWarnings())    }    invisible(structure(msg, class = "try-error"))})
12: try(.Internal(eval.with.vis(expr, .GlobalEnv, baseenv())), silent = TRUE)
13: evalFunc(ce, options)
14: driver$runcode(drobj, chunk, chunkopts)
15: utils::Sweave(f, quiet = quiet)
16: doTryCatch(return(expr), name, parentenv, handler)
17: tryCatchOne(expr, names, parentenv, handlers[[1]])
18: tryCatchList(expr, classes, parentenv, handlers)
19: tryCatch(utils::Sweave(f, quiet = quiet), error = function(e) {    stop(gettextf("processing vignette '%s' failed with diagnostics:\n%s",         f, conditionMessage(e)), domain = NA, call. = FALSE)})
20: buildVignettes(dir = ".")
aborting ...