Entering edit mode
ekl
•
0
@ekl-22229
Last seen 5.0 years ago
I tried what you suggested about the CDF, and got the following error message.
> library(BiocManager)
Bioconductor version 3.9 (BiocManager 1.30.8), ?BiocManager::install for help
Bioconductor version '3.9' is out-of-date; the current release version '3.10'
is available with R version '3.6'; see https://bioconductor.org/install
> install("makecdfenv")
Bioconductor version 3.9 (BiocManager 1.30.8), R 3.6.1 (2019-07-05)
Installing package(s) 'makecdfenv'
trying URL 'https://bioconductor.org/packages/3.9/bioc/bin/windows/contrib/3.6/makecdfenv_1.60.0.zip'
Content type 'application/zip' length 3419205 bytes (3.3 MB)
downloaded 3.3 MB
package ‘makecdfenv’ successfully unpacked and MD5 sums checked
The downloaded binary packages are in
C:\Users\EKL\AppData\Local\Temp\RtmpsvwvR7\downloaded_packages
Old packages: 'BiocManager', 'boot', 'digest', 'foreign', 'hms', 'KernSmooth',
'mgcv', 'nlme', 'rlang'
Update all/some/none? [a/s/n]: library(makecdfenv)
Update all/some/none? [a/s/n]: make.cdf.package("C:\\Users\\EKL\\Downloads\\GPL8345_AFLAVUSa520391F.cdf", "aflavusa520391fcdf", version = "0.0.1", species = "Aspergillus_flavus")
Update all/some/none? [a/s/n]: install.packages("aflavus520391fcdf", type = "source", repos = NULL)
Update all/some/none? [a/s/n]: n
> library(affy)
Loading required package: BiocGenerics
Loading required package: parallel
Attaching package: ‘BiocGenerics’
The following object is masked _by_ ‘.GlobalEnv’:
design
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:stats’:
IQR, mad, sd, var, xtabs
The following objects are masked from ‘package:base’:
anyDuplicated, append, as.data.frame, basename, cbind, colnames,
dirname, do.call, duplicated, eval, evalq, Filter, Find, get, grep,
grepl, intersect, is.unsorted, lapply, Map, mapply, match, mget,
order, paste, pmax, pmax.int, pmin, pmin.int, Position, rank,
rbind, Reduce, rownames, sapply, setdiff, sort, table, tapply,
union, unique, unsplit, which, which.max, which.min
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")'.
> eset<-ReadAffy(celfile.path="C:\\Users\\EKL\\Downloads\\GSE57629_RAW")
> eset
AffyBatch object
size of arrays=716x716 features (26 kb)
cdf=AFLAVUSa520391F (??? affyids)
number of samples=18
Error in getCdfInfo(object) :
Could not obtain CDF environment, problems encountered:
Specified environment does not contain AFLAVUSa520391F
Library - package aflavusa520391fcdf not installed
Bioconductor - aflavusa520391fcdf not available
In addition: Warning message:
missing cdf environment! in show(AffyBatch)
Also, when you are posting a question, below the box you are writing in is a preview box that shows what your post will look like. You should ensure that your formatting is correct, and you can read about how to do that here.
Thank you so much! I am new to bioinformatics, so thank you for your patience!
It worked! I was putting the commands in too quickly.