Rredland installation
1
0
Entering edit mode
anupam sinha ▴ 270
@anupam-sinha-3207
Last seen 9.6 years ago
HI all, I have been trying to install Rredland on a Fedora 10 system for some time now. Prior to the installation of Rredland I had installed Redland , Raptor and Rasqal libraries using yum. After the installation of Rredland when I try to load the library ,it gives a segmentation fault. > library(Rredland) Loading required package: graph *** caught segfault *** address 0x26617d, cause 'invalid permissions' Traceback: 1: .Call("get_open_redl_world", PACKAGE = "Rredland") 2: openRedlWorld() 3: assign("..GredlWorld", openRedlWorld(), "package:Rredland") 4: fun(...) 5: doTryCatch(return(expr), name, parentenv, handler) 6: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 7: tryCatchList(expr, classes, parentenv, handlers) 8: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call)[1L] prefix <- paste("Error in", dcall, ": ") LONG <- 75L msg <- conditionMessage(e) sm <- strsplit(msg, "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste(prefix, "\n ", sep = "") } else prefix <- "Error : " msg <- paste(prefix, conditionMessage(e), "\n", sep = "") .Internal(seterrmessage(msg[1L])) if (!silent && identical(getOption("show.error.messages"), TRUE)) { cat(msg, file = stderr()) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error"))}) 9: try({ fun(...) NULL}) 10: runHook(".onAttach", ns, dirname(nspath), nsname) 11: attachNamespace(ns, pos = pos, dataPath = dataPath) 12: doTryCatch(return(expr), name, parentenv, handler) 13: tryCatchOne(expr, names, parentenv, handlers[[1L]]) 14: tryCatchList(expr, classes, parentenv, handlers) 15: tryCatch(expr, error = function(e) { call <- conditionCall(e) if (!is.null(call)) { if (identical(call[[1L]], quote(doTryCatch))) call <- sys.call(-4L) dcall <- deparse(call)[1L] prefix <- paste("Error in", dcall, ": ") LONG <- 75L msg <- conditionMessage(e) sm <- strsplit(msg, "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type = "w") if is.na(w)) w <- 14L + nchar(dcall, type = "b") + nchar(sm[1L], type = "b") if (w > LONG) prefix <- paste(prefix, "\n ", sep = "") } else prefix <- "Error : " msg <- paste(prefix, conditionMessage(e), "\n", sep = "") .Internal(seterrmessage(msg[1L])) if (!silent && identical(getOption("show.error.messages"), TRUE)) { cat(msg, file = stderr()) .Internal(printDeferredWarnings()) } invisible(structure(msg, class = "try-error"))}) 16: try({ ns <- loadNamespace(package, c(which.lib.loc, lib.loc), keep.source = keep.source) dataPath <- file.path(which.lib.loc, package, "data") env <- attachNamespace(ns, pos = pos, dataPath = dataPath)}) 17: library(Rredland) Possible actions: 1: abort (with core dump, if enabled) 2: normal R exit 3: exit R without saving workspace 4: exit R saving workspace Selection: 1 aborting ... Segmentation fault [[alternative HTML version deleted]]
Rredland Rredland • 1.1k views
ADD COMMENT
0
Entering edit mode
anupam sinha ▴ 270
@anupam-sinha-3207
Last seen 9.6 years ago
Hi all, Apologies for sending an incomplete mail. This is the sessionInfo() output. > sessionInfo() R version 2.10.0 (2009-10-26) i386-redhat-linux-gnu locale: [1] LC_CTYPE=en_US.UTF-8 LC_NUMERIC=C [3] LC_TIME=en_US.UTF-8 LC_COLLATE=en_US.UTF-8 [5] LC_MONETARY=C LC_MESSAGES=en_US.UTF-8 [7] LC_PAPER=en_US.UTF-8 LC_NAME=C [9] LC_ADDRESS=C LC_TELEPHONE=C [11] LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C attached base packages: [1] stats graphics grDevices utils datasets methods base Can anyone help me out? Thanks in advance. Regards, Anupam On Tue, May 25, 2010 at 10:47 AM, anupam sinha <anupam.contact@gmail.com>wrote: > HI all, > I have been trying to install Rredland on a Fedora 10 system > for some time now. Prior to the installation of Rredland I had installed > Redland , Raptor and Rasqal libraries using yum. After the installation of > Rredland when I try to load the library ,it gives a segmentation fault. > > > > library(Rredland) > Loading required package: graph > > *** caught segfault *** > address 0x26617d, cause 'invalid permissions' > > Traceback: > 1: .Call("get_open_redl_world", PACKAGE = "Rredland") > 2: openRedlWorld() > 3: assign("..GredlWorld", openRedlWorld(), "package:Rredland") > 4: fun(...) > 5: doTryCatch(return(expr), name, parentenv, handler) > 6: tryCatchOne(expr, names, parentenv, handlers[[1L]]) > 7: tryCatchList(expr, classes, parentenv, handlers) > 8: tryCatch(expr, error = function(e) { call <- conditionCall(e) if > (!is.null(call)) { if (identical(call[[1L]], > quote(doTryCatch))) call <- sys.call(-4L) dcall <- > deparse(call)[1L] prefix <- paste("Error in", dcall, ": ") > LONG <- 75L msg <- conditionMessage(e) sm <- strsplit(msg, > "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type > = "w") if is.na(w)) w <- 14L + nchar(dcall, type = > "b") + nchar(sm[1L], type = "b") if (w > > LONG) prefix <- paste(prefix, "\n ", sep = "") } else > prefix <- "Error : " msg <- paste(prefix, conditionMessage(e), "\n", sep > = "") .Internal(seterrmessage(msg[1L])) if (!silent && > identical(getOption("show.error.messages"), TRUE)) { cat(msg, > file = stderr()) .Internal(printDeferredWarnings()) } > invisible(structure(msg, class = "try-error"))}) > 9: try({ fun(...) NULL}) > 10: runHook(".onAttach", ns, dirname(nspath), nsname) > 11: attachNamespace(ns, pos = pos, dataPath = dataPath) > 12: doTryCatch(return(expr), name, parentenv, handler) > 13: tryCatchOne(expr, names, parentenv, handlers[[1L]]) > 14: tryCatchList(expr, classes, parentenv, handlers) > 15: tryCatch(expr, error = function(e) { call <- conditionCall(e) if > (!is.null(call)) { if (identical(call[[1L]], > quote(doTryCatch))) call <- sys.call(-4L) dcall <- > deparse(call)[1L] prefix <- paste("Error in", dcall, ": ") > LONG <- 75L msg <- conditionMessage(e) sm <- strsplit(msg, > "\n")[[1L]] w <- 14L + nchar(dcall, type = "w") + nchar(sm[1L], type > = "w") if is.na(w)) w <- 14L + nchar(dcall, type = > "b") + nchar(sm[1L], type = "b") if (w > > LONG) prefix <- paste(prefix, "\n ", sep = "") } else > prefix <- "Error : " msg <- paste(prefix, conditionMessage(e), "\n", sep > = "") .Internal(seterrmessage(msg[1L])) if (!silent && > identical(getOption("show.error.messages"), TRUE)) { cat(msg, > file = stderr()) .Internal(printDeferredWarnings()) } > invisible(structure(msg, class = "try-error"))}) > 16: try({ ns <- loadNamespace(package, c(which.lib.loc, lib.loc), > keep.source = keep.source) dataPath <- file.path(which.lib.loc, package, > "data") env <- attachNamespace(ns, pos = pos, dataPath = dataPath)}) > 17: library(Rredland) > > Possible actions: > 1: abort (with core dump, if enabled) > 2: normal R exit > 3: exit R without saving workspace > 4: exit R saving workspace > Selection: 1 > aborting ... > Segmentation fault > > > [[alternative HTML version deleted]]
ADD COMMENT

Login before adding your answer.

Traffic: 632 users visited in the last hour
Help About
FAQ
Access RSS
API
Stats

Use of this site constitutes acceptance of our User Agreement and Privacy Policy.

Powered by the version 2.3.6