R/zzz.R
60bf7869
 BUILT_RCPP_VERSION = package_version("1.0.6")
fe6a7d3a
 
 .onLoad <-
     function(libname, pkgname) {
       ## checkeing installed vs build-time Rcpp version
       if (Sys.info()['sysname'] %in% c("Darwin", "Windows")) {
         installedRcpp <- utils::packageVersion("Rcpp")
9f035cae
           if (installedRcpp != BUILT_RCPP_VERSION) { # use > instead of !=?
fe6a7d3a
             msg <- paste0("mzR has been built against a different Rcpp version (", BUILT_RCPP_VERSION, ")\n",
                           "than is installed on your system (", installedRcpp, "). This might lead to errors\n",
                           "when loading mzR. If you encounter such issues, please send a report,\n",
3fbfa07d
                           "including the output of sessionInfo() to the Bioc support forum at \n",
                           "https://support.bioconductor.org/. For details see also\n",
fe6a7d3a
                           "https://github.com/sneumann/mzR/wiki/mzR-Rcpp-compiler-linker-issue.")
9f035cae
             warning(msg)
fe6a7d3a
           }
       }
       require2 <- require
       require2("methods", character.only = TRUE, quietly = TRUE)
9f035cae
       #loadRcppModules()
       loadModule("Ramp", TRUE)
       loadModule("Pwiz", TRUE)
       loadModule("Ident", TRUE)
8e42dc25
       Sys.setenv("HDF5_DISABLE_VERSION_CHECK"=2)
 }