Dear all I'm new in R packages and got problems running TCGAanalyzeDEA of TCGAbiolinks with the following error "Error in names(x) <- value : 'names' attribute [7] must be the same length as the vector [5]". No error was reported till the TCGAanalyzeDEA functions was used. Any help will be greatly appreciated.
Here are the scripts I used: library(TCGAbiolinks) library(SummarizedExperiment) setwd("I:/Rdata/WTTARGET") queryexpWT <- GDCquery(project = c("TARGET-WT"), data.category = "Transcriptome Profiling", data.type = "Gene Expression Quantification", workflow.type = "HTSeq - Counts", sample.type = c("Primary solid Tumor","Solid Tissue Normal")) resultsexpWT <- getResults(queryexpWT) GDCdownload(queryexpWT, method = "client") WT.exp <- GDCprepare(query = queryexpWT, save = TRUE, save.filename = "WTExp.rda") dataPrepWT <- TCGAanalyzePreprocessing(object = WT.exp, cor.cut = 0.6) dataNormWT<- TCGAanalyzeNormalization(tabDF = dataPrepWT, geneInfo = geneInfoHT, method = "gcContent") dataFiltWT <- TCGAanalyzeFiltering(tabDF = dataNormWT, method = "quantile", qnt.cut = 0.25) dataSmTPWT <- TCGAquerySampleTypes(getResults(queryexpWT,cols="cases"),"TP") dataSmNTWT <- TCGAquerySampleTypes(getResults(queryexpWT,cols="cases"),"NT") matNT <- dataFiltWT[ ,dataSmNTWT] matTP <- dataFiltWT[ ,dataSmTPWT] dataDEGsWT <- TCGAanalyzeDEA(mat1 = matNT, mat2 = matTP, Cond1type = "Normal", Cond2type = "Tumor", fdr.cut = 0.01, logFC.cut = 1.5, method = "glmLRT", paired = FALSE)
Hi Kevin,
I realize this was a few years ago now, but I'm stuck on the same error. I went through your responses on Biostars, but I'm still confused.
Firstly, I'm trying to load data I downloaded from cbioportal. I have 2 RNA expression data frames (rna.normal.4 and rna.4), one for normal breast samples and one for tumour samples. I formatted the data frames so that the row names is the gene ID, and the columns are the RSEM counts for each sample.
When I run:
I get the following error:
The dimensions of the data frames are as follows:
Is the error appearing because there are more tumor samples than normal? That can't be right, as it's very common for there to be more samples in one case compared to another.
The error appears whether I set PAIRED=TRUE or FALSE.
I would really appreciate your help!