Hello all,
after downloading my packages i went to load the libraries
> library(GEOquery)
Loading required package: Biobase
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 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
Welcome to Bioconductor
Vignettes contain introductory material; view with
'browseVignettes()'. To cite Bioconductor, see
'citation("Biobase")', and for packages 'citation("pkgname")'.
Setting options('download.file.method.GEOquery'='auto')
Warning message:
package ‘BiocGenerics’ was built under R version 3.1.2
> library(affy)
> library(gcrma)
> library(hugene10stv1cdf)
> library(hugene10stv1probe)
Loading required package: AnnotationDbi
Loading required package: stats4
Loading required package: GenomeInfoDb
Loading required package: S4Vectors
Loading required package: IRanges
Attaching package: ‘AnnotationDbi’
The following object is masked from ‘package:GenomeInfoDb’:
species
Warning messages:
1: package ‘AnnotationDbi’ was built under R version 3.1.3
2: package ‘GenomeInfoDb’ was built under R version 3.1.3
3: package ‘IRanges’ was built under R version 3.1.2
> library(hugene10stprobeset.db)
Loading required package: org.Hs.eg.db
Loading required package: DBI
hugene10stprobeset.db is based on exon probesets. For a more
gene-centric view, use the transcriptcluster version of this package.
Warning messages:
1: package ‘RSQLite’ was built under R version 3.1.3
2: package ‘DBI’ was built under R version 3.1.3
> library(hugene10sttranscriptcluster.db)
what does it mean? should i install R version 3.1.3 ?? or libraries have been installed successfully?
What version of R are you using, e.g., the output of
or