Hi guys,
I've been back and forth on this with all sorts of variations, but error keeps coming up. Basically trying to create a geneLists for analysis for clusterprofiler. My numeric are Fisher's P.values from a meta analysis and the names are Gene Symbols though I did also try ProbeIDs.
Any chance you know why I'm getting the data.frame error. Oh I check manually if there were differing rows, but didn't find any.
Thanks!
> genelist <- blood_sorted_001[,11]
> names(geneList) = as.character(blood_sorted_001[,1])
> geneList = sort(geneList, decreasing = TRUE)
> kk2 <- gseKEGG(geneList = geneList,
+                organism = 'hsa',
+                nPerm = 1000,
+                minGSSize= 120,
+                pvalueCutoff = 0.05,
+                verbose = FALSE)
Error in data.frame(ID = as.character(tmp_res$pathway), Description = Description,  : 
  arguments imply differing number of rows: 0, 1
In addition: Warning messages:
1: In min(p) : no non-missing arguments to min; returning Inf
2: In max(p) : no non-missing arguments to max; returning -Inf
3: In min(p) : no non-missing arguments to min; returning Inf
4: In max(p) : no non-missing arguments to max; returning -Inf 

So the problem here is you are using the wrong ID type.
For me, I will update the source code to throw more useful/informative error msg.