Error while loading library GeneExpressionSignature
1
0
Entering edit mode
Guest User ★ 13k
@guest-user-4897
Last seen 9.7 years ago
Hello! I'm trying to load library but getting error: ???????????????? ???????????????????? ????????????: DBI Error : .onLoad ???? ?????????????? ?? loadNamespace() ?????? 'GO.db', ??????????????????????: ??????????: sqliteNewConnection(drv, ...) ????????????: RS-DBI driver: (could not connect to dbname: unable to open database file ) ????????????: ?????????? ???GO.db??? ???????????? ?????????????????? -- output of sessionInfo(): > sessionInfo() R version 3.1.1 (2014-07-10) Platform: i386-w64-mingw32/i386 (32-bit) locale: [1] LC_COLLATE=Russian_Russia.1251 LC_CTYPE=Russian_Russia.1251 LC_MONETARY=Russian_Russia.1251 LC_NUMERIC=C LC_TIME=Russian_Russia.1251 attached base packages: [1] parallel stats graphics grDevices utils datasets methods base other attached packages: [1] RSQLite_0.11.4 DBI_0.2-7 AnnotationDbi_1.26.0 GenomeInfoDb_1.0.2 Biobase_2.24.0 BiocGenerics_0.10.0 loaded via a namespace (and not attached): [1] BiocInstaller_1.14.2 IRanges_1.22.9 stats4_3.1.1 tools_3.1.1 -- Sent via the guest posting facility at bioconductor.org.
• 678 views
ADD COMMENT
0
Entering edit mode
yang Cao ▴ 10
@yang-cao-6655
Last seen 9.7 years ago
Hello, I can load this package successfully, see details as following: library(GeneExpressionSignature) è½½å ¥éœ€è¦çš„ç¨‹è¾‘åŒ ï¼šPGSEA è½½å ¥éœ€è¦çš„ç¨‹è¾‘åŒ ï¼šGO.db è½½å ¥éœ€è¦çš„ç¨‹è¾‘åŒ ï¼šAnnotationDbi è½½å ¥éœ€è¦çš„ç¨‹è¾‘åŒ ï¼šGenomeInfoDb è½½å ¥éœ€è¦çš„ç¨‹è¾‘åŒ ï¼šS4Vectors è½½å ¥éœ€è¦çš„ç¨‹è¾‘åŒ ï¼šIRanges è½½å ¥ç¨‹è¾‘åŒ ï¼šâ€˜IRanges’ The following objects are masked from ‘package:S4Vectors’: .Call2, aggregate.Rle, as.data.frame.Rle, as.data.frame.Vector, as.env, as.list.Rle, classNameForDisplay, compare, countMatches, countQueryHits, countSubjectHits, diff.Rle, duplicated.DataTable, duplicated.Rle, duplicated.Vector, elementMetadata, elementMetadata<-, findMatches, findRun, fixedColumnNames, fold, get_showHeadLines, get_showTailLines, isConstant, isSingleInteger, isSingleNumber, isSingleNumberOrNA, isSingleString, isSingleStringOrNA, isTRUEorFALSE, levels.Rle, mcols, mcols<-, mean.Rle, median.Rle, metadata, metadata<-, new2, nrun, quantile.Rle, queryHits, queryLength, recycleIntegerArg, recycleNumericArg, remapHits, rename, rev.Rle, Rle, runLength, runLength<-, runmean, runq, runsum, runValue, runValue<-, runwtsum, safeExplode, selfmatch, setMethods, setValidity2, shiftApply, showAsCell, sort.Rle, sort.Vector, strsplitAsListOfIntegerVectors, subjectHits, subjectLength, summary.Rle, svn.time, unique.Rle, unique.Vector, unstrsplit, values, values<-, width The following objects are masked from ‘package:BiocGenerics’: end<-, start<-, width, width<- è½½å ¥ç¨‹è¾‘åŒ ï¼šâ€˜AnnotationDbi’ The following object is masked from ‘package:GenomeInfoDb’: species è½½å ¥éœ€è¦çš„ç¨‹è¾‘åŒ ï¼šDBI è½½å ¥éœ€è¦çš„ç¨‹è¾‘åŒ ï¼šKEGG.db KEGG.db contains mappings based on older data because the original resource was removed from the the public domain before the most recent update was produced. This package should now be considered deprecated and future versions of Bioconductor may not have it available. Users who want more current data are encouraged to look at the KEGGREST or reactome.db packages è½½å ¥éœ€è¦çš„ç¨‹è¾‘åŒ ï¼šannaffy There were 50 or more warnings (use warnings() to see the first 50) sessionInfo() R version 3.1.1 (2014-07-10) Platform: i386-w64-mingw32/i386 (32-bit) locale: [1] LC_COLLATE=Chinese (Simplified)_People's Republic of China.936 [2] LC_CTYPE=Chinese (Simplified)_People's Republic of China.936 [3] LC_MONETARY=Chinese (Simplified)_People's Republic of China.936 [4] LC_NUMERIC=C [5] LC_TIME=Chinese (Simplified)_People's Republic of China.936 attached base packages: [1] parallel stats graphics grDevices utils datasets methods base other attached packages: [1] GeneExpressionSignature_1.10.0 PGSEA_1.38.0 annaffy_1.36.0 [4] KEGG.db_2.14.0 GO.db_2.14.0 RSQLite_0.11.4 [7] DBI_0.2-7 AnnotationDbi_1.27.8 GenomeInfoDb_1.1.10 [10] IRanges_1.22.9 S4Vectors_0.1.2 BiocInstaller_1.15.5 [13] Biobase_2.25.0 BiocGenerics_0.11.3 loaded via a namespace (and not attached): [1] packrat_0.3.0.104 stats4_3.1.1 tools_3.1.1 2014-07-18 3:49 GMT+08:00 Alex [guest] <guest@bioconductor.org>: > Hello! I'm trying to load library but getting error: > > Загрузка требуемого пакета: DBI > Error : .onLoad не удалось в loadNamespace() для 'GO.db', подробности: > вызов: sqliteNewConnection(drv, ...) > ошибка: RS-DBI driver: (could not connect to dbname: > unable to open database file > ) > Ошибка: пакет ‘GO.db’ нельзя загрузить > > -- output of sessionInfo(): > > > sessionInfo() > R version 3.1.1 (2014-07-10) > Platform: i386-w64-mingw32/i386 (32-bit) > > locale: > [1] LC_COLLATE=Russian_Russia.1251 LC_CTYPE=Russian_Russia.1251 > LC_MONETARY=Russian_Russia.1251 LC_NUMERIC=C > LC_TIME=Russian_Russia.1251 > > attached base packages: > [1] parallel stats graphics grDevices utils datasets methods > base > > other attached packages: > [1] RSQLite_0.11.4 DBI_0.2-7 AnnotationDbi_1.26.0 > GenomeInfoDb_1.0.2 Biobase_2.24.0 BiocGenerics_0.10.0 > > loaded via a namespace (and not attached): > [1] BiocInstaller_1.14.2 IRanges_1.22.9 stats4_3.1.1 > tools_3.1.1 > > -- > Sent via the guest posting facility at bioconductor.org. > [[alternative HTML version deleted]]
ADD COMMENT

Login before adding your answer.

Traffic: 400 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