oncogenetics / LocusExplorer

An interactive graphical illustration of genetic associations and their biological context
MIT License
14 stars 15 forks source link

x86_64-apple-darwin13.4.0 (64-bit) - *** caught segfault *** address 0x0, cause 'unknown' #67

Closed zx8754 closed 9 years ago

zx8754 commented 9 years ago

Fatal Error on RStudio

Following Tracback is from RGUI

R version 3.2.2 (2015-08-14) -- "Fire Safety"
Copyright (C) 2015 The R Foundation for Statistical Computing
Platform: x86_64-apple-darwin13.4.0 (64-bit)

R is free software and comes with ABSOLUTELY NO WARRANTY.
You are welcome to redistribute it under certain conditions.
Type 'license()' or 'licence()' for distribution details.

  Natural language support but running in an English locale

R is a collaborative project with many contributors.
Type 'contributors()' for more information and
'citation()' on how to cite R or R packages in publications.

Type 'demo()' for some demos, 'help()' for on-line help, or
'help.start()' for an HTML browser interface to help.
Type 'q()' to quit R.

[R.app GUI 1.66 (6996) x86_64-apple-darwin13.4.0]

[History restored from /Users/mmijuskovic/.Rapp.history]

> library(shiny)
> runApp()

Listening on http://127.0.0.1:5268

Attaching package: ‘shinyjs’

The following object is masked from ‘package:shiny’:

    runExample

The following object is masked from ‘package:graphics’:

    text

The following objects are masked from ‘package:methods’:

    removeClass, show

data.table 1.9.6  For help type ?data.table or https://github.com/Rdatatable/data.table/wiki
The fastest way to learn (by data.table authors): https://www.datacamp.com/courses/data-analysis-the-data-table-way

Attaching package: ‘dplyr’

The following objects are masked from ‘package:data.table’:

    between, last

The following objects are masked from ‘package:stats’:

    filter, lag

The following objects are masked from ‘package:base’:

    intersect, setdiff, setequal, union

Use suppressPackageStartupMessages to eliminate package startup messages.

Attaching package: ‘DT’

The following objects are masked from ‘package:shiny’:

    dataTableOutput, renderDataTable

Loading required package: BiocGenerics
Loading required package: parallel

Attaching package: ‘BiocGenerics’

The following objects are masked from ‘package:parallel’:

    clusterApply, clusterApplyLB, clusterCall, clusterEvalQ, clusterExport, clusterMap, parApply, parCapply, parLapply,
    parLapplyLB, parRapply, parSapply, parSapplyLB

The following objects are masked from ‘package:dplyr’:

    combine, intersect, setdiff, union

The following object is masked from ‘package:stats’:

    xtabs

The following objects are masked from ‘package:base’:

    anyDuplicated, append, as.data.frame, as.vector, cbind, colnames, do.call, duplicated, eval, evalq, Filter, Find, get,
    intersect, is.unsorted, lapply, Map, mapply, match, mget, order, paste, pmax, pmax.int, pmin, pmin.int, Position,
    rank, rbind, Reduce, rep.int, rownames, sapply, setdiff, sort, table, tapply, union, unique, unlist, unsplit

Creating a generic function for ‘nchar’ from package ‘base’ in package ‘S4Vectors’
Need specific help about ggbio? try mailing 
 the maintainer or visit http://tengfei.github.com/ggbio/

Attaching package: ‘ggbio’

The following objects are masked from ‘package:ggplot2’:

    geom_bar, geom_rect, geom_segment, ggsave, stat_bin, stat_identity, xlim

The following object is masked from ‘package:shinyjs’:

    reset

Loading required package: S4Vectors
Loading required package: stats4

Attaching package: ‘S4Vectors’

The following object is masked from ‘package:dplyr’:

    rename

Loading required package: IRanges

Attaching package: ‘IRanges’

The following object is masked from ‘package:tidyr’:

    expand

The following objects are masked from ‘package:dplyr’:

    collapse, desc, slice

The following object is masked from ‘package:data.table’:

    shift

Loading required package: GenomeInfoDb
Loading required package: GenomicFeatures
Loading required package: AnnotationDbi
Loading required package: Biobase
Welcome to Bioconductor

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

Attaching package: ‘AnnotationDbi’

The following object is masked from ‘package:dplyr’:

    select

Loading required package: DBI

Note: the specification for S3 class “AsIs” in package ‘jsonlite’ seems equivalent to one from package ‘BiocGenerics’: not turning on duplicate class definitions for this class.

 *** caught segfault ***
address 0x0, cause 'unknown'

Traceback:
 1: .Call("dplyr_filter_impl", PACKAGE = "dplyr", df, dots)
 2: filter_impl(.data, dots)
 3: filter_.tbl_df(tbl_df(.data), .dots = dots)
 4: filter_(tbl_df(.data), .dots = dots)
 5: as.data.frame(filter_(tbl_df(.data), .dots = dots))
 6: filter_.data.frame(.data, .dots = lazyeval::lazy_dots(...))
 7: filter_(.data, .dots = lazyeval::lazy_dots(...))
 8: filter(., BP >= zoomStart() & BP <= zoomEnd())
 9: function_list[[k]](value)
10: withVisible(function_list[[k]](value))
11: freduce(value, `_function_list`)
12: `_fseq`(`_lhs`)
13: eval(expr, envir, enclos)
14: eval(quote(`_fseq`(`_lhs`)), env, env)
15: withVisible(eval(quote(`_fseq`(`_lhs`)), env, env))
16: ROIdatGeneticMap() %>% filter(BP >= zoomStart() & BP <= zoomEnd())
17: .func()
18: withCallingHandlers(expr, error = function(e) {    handle <- getOption("shiny.error")    if (is.function(handle))         handle()})
19: shinyCallingHandlers(.func())
20: doTryCatch(return(expr), name, parentenv, handler)
21: tryCatchOne(expr, names, parentenv, handlers[[1L]])
22: tryCatchList(expr, classes, parentenv, handlers)
23: 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 <- paste0(prefix, "\n  ")    }    else prefix <- "Error : "    msg <- paste0(prefix, conditionMessage(e), "\n")    .Internal(seterrmessage(msg[1L]))    if (!silent && identical(getOption("show.error.messages"),         TRUE)) {        cat(msg, file = stderr())        .Internal(printDeferredWarnings())    }    invisible(structure(msg, class = "try-error", condition = e))})
24: try(shinyCallingHandlers(.func()), silent = TRUE)
25: withVisible(try(shinyCallingHandlers(.func()), silent = TRUE))
26: func()
27: withCallingHandlers(expr, error = function(e) {    handle <- getOption("shiny.error")    if (is.function(handle))         handle()})
28: shinyCallingHandlers(func())
29: env$runWith(self, func)
30: tryCatchList(expr, classes, parentenv, handlers)
31: tryCatch(env$runWith(self, func), finally = .graphExitContext(id))
32: withReactiveDomain(.domain, {    env <- .getReactiveEnvironment()    .graphEnterContext(id)    tryCatch(env$runWith(self, func), finally = .graphExitContext(id))})
33: ctx$run(function() {    result <- withVisible(try(shinyCallingHandlers(.func()),         silent = TRUE))    .visible <<- result$visible    .value <<- result$value})
34: self$.updateValue()
35: plotDatGeneticMap()

Possible actions:
1: abort (with core dump, if enabled)
2: normal R exit
3: exit R without saving workspace
4: exit R saving workspace
zx8754 commented 9 years ago

Removing all packages and reinstalling only required packages solves this issue, see: