Entering edit mode
I'm new to the world of R, and have been facing this issue and nothing over the internet helped me solve it so am noting it down here.
Thank you for your help.
setwd("~/Desktop/IISc/Melaroma")
library(GEOquery)
my_id <- "GSE4843"
gse <- getGEO(my_id)
length(gse)
## [1] 1
gse <-gse[[1]]
gse
library(WGCNA)
options(stringsAsFactors = FALSE)
expression = as.data.frame(gse[, -c(1)])
expression = t(expression)
colnames(expression) = gse$EST
rownames(expression) = names(gse)[-c(1)]
sampleTree = hclust(dist(expression), method = "average")
Error in hclust(dist(expression), method = "average") :
NaN dissimilarity value.
In addition: Warning message:
In dist(expression) : NAs introduced by coercion
Thank you @ATpoint
can you suggest some good tutorials for WGCNA?
https://horvath.genetics.ucla.edu/html/CoexpressionNetwork/Rpackages/WGCNA/