problem with ClusterRepro function
1
0
Entering edit mode
@antonioaubry-21610
Last seen 6 weeks ago
United States

Hi, I am trying to run the clusterRepro function (see below) but am running into a problem.

impExpr = list();
for (set in 1:nSets)
{
  impExpr[[set]] = list(data = t(impute.knn(t(multiExpr[[set]]$data))$data));
}

impExpr
eigengenes = list();
for (set in 1:nSets)
{
  eigengenes[[set]] = multiSetMEs(impExpr, universalColors = colorList[[set]], excludeGrey = TRUE);
  for (ss in 1:nSets)
  {
    rownames(eigengenes[[set]][[ss]]$data) = rownames(multiExpr[[ss]]$data);
  }
}

rownames(multiExpr[[ss]]$data)

library(clusterRepro)
cr = list();
set.seed(20);
for (ref in 1:nSets)
{
  cr[[ref]] = list();
  for (test in 1:nSets)
  {
    printFlush(system.time({
      cr[[ref]][[test]] = clusterRepro(Centroids = as.matrix(eigengenes[[ref]][[test]]$data),
                                       New.data = as.matrix(impExpr[[test]]$data),
                                       Number.of.permutations = 10000); }));
    collectGarbage();
  }
}

When I run this code I get the error message "Error in cor(Data, Centroids, use = "pairwise.complete.obs", method = "pearson") : 'x' is empty", and the website for the module preservation is down so I am unsure of how to proceed.

WGCNA • 165 views
ADD COMMENT
0
Entering edit mode
@james-w-macdonald-5106
Last seen 23 hours ago
United States

Both WGCNA and clusterRepro are CRAN packages, not Bioconductor. You can ask over at biostars.org, or on r-help@r-project.org.

Login before adding your answer.

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