Dear all,
Please forgive any follies, I am an R novice.
I have downloaded ~1000 GPL570 (Affymetrix U133 Plus 2) microarrays from GEO. Of these, 120 are not annotated with a gender. I want to use MassiR to predict the gender of my samples. However, I have some trouble loading the code. From looking up the error message (See below in bold and highlighted) on other places on this Forum, i gather that it may be due to:
A) Use of commas instead or periods in the values, or data being recognized as text rather than numbers. Or,
B) Plotting a figure consisting of NA (missing values)
I understand that subsequent errors are probably generated because in the output from "massi.y.out" is taken as an input. The ">massi_y_plot(massi.y.out)" returned empty.
Thank you for your help,
Tristan
> library(massiR)
Loading required package: cluster
Loading required package: gplots
Attaching package: ‘gplots’
The following object is masked from ‘package:stats’:
lowess
Loading required package: diptest
> data(massi.eset)
> data(y.probes)
> probes <-
+ y.probes$affy_hg_u133_plus_2
> rownames(probes)
[1] "1565320_at" "224143_at" "224142_s_at" "233151_s_at" "234309_at"
[6] "217261_at" "216665_s_at" "216673_at" "243384_at" "216374_at"
[11] "207893_at" "201909_at" "207246_at" "230760_at" "207247_s_at"
[16] "233178_at" "217049_x_at" "211227_s_at" "210292_s_at" "207918_s_at"
[21] "217160_at" "208220_x_at" "211462_s_at" "214983_at" "228492_at"
[26] "206624_at" "208805_at" "216376_x_at" "216786_at" "235941_s_at"
[31] "205001_s_at" "1570360_s_at" "205000_at" "1570359_at" "208339_at"
[36] "211149_at" "208067_x_at" "210322_x_at" "224007_at" "211460_at"
[41] "207063_at" "224003_at" "209772_s_at" "1562313_at" "232618_at"
[46] "223645_s_at" "236694_at" "223646_s_at" "214131_at" "206769_at"
[51] "206922_at" "207703_at" "1554125_a_at" "207646_s_at" "207647_at"
[56] "224052_at" "224293_at" "206700_s_at" "1555743_s_at" "211614_at"
[61] "204410_at" "204409_s_at" "221179_at" "208307_at" "224292_at"
[66] "207916_at" "216664_at" "224041_at" "224040_at" "1552952_at"
[71] "216544_at" "234913_at" "208332_at" "232402_at" "211461_at"
[76] "234715_at" "224270_at" "208331_at" "208282_x_at" "207909_x_at"
[81] "216922_x_at" "208281_x_at" "216351_x_at" "207912_s_at" "1555444_a_at"
[86] "234931_at" "1556677_at" "237225_at" "204060_s_at" "206279_at"
[91] "1569787_at" "224195_at" "224174_at" "216842_x_at"
> massi.y.out <- massi_y(massi.eset, probes)
> massi_y_plot(massi.y.out)
Error in plot.window(xlim, ylim, log = log, ...) :
need finite 'xlim' values
In addition: Warning messages:
1: In min(w.l) : no non-missing arguments to min; returning Inf
2: In max(w.r) : no non-missing arguments to max; returning -Inf
3: In min(x) : no non-missing arguments to min; returning Inf
4: In max(x) : no non-missing arguments to max; returning -Inf
> massi.select.out <-
+ massi_select(massi.eset, probes, threshold=4)
> head(massi.select.out)[,1:5]
[1] S1 S2 S3 S4 S5
<0 rows> (or 0-length row.names)
> results <- massi_cluster(massi.select.out)
Error in pam(x = y_data.subset.t, k = 2) :
No clustering performed, NAs in the computed dissimilarity matrix.
> sample.results <- data.frame(results[[2]])
Error in data.frame(results[[2]]) : object 'results' not found
> head(sample.results)
Error in head(sample.results) : object 'sample.results' not found
> massi_cluster_plot(massi.select.out, results)
Error in heatmap.2(x = as.matrix(massi_select_data[ord, ]), keysize = 2, :
`x' must be a numeric matrix
> summary(massi.eset)
Length Class Mode
1 ExpressionSet S4
> summary(probes)
< table of extent 0 x 0 >