Enter the body of text here
Code should be placed in three backticks as shown below
untar("gdc_download_20220310_195149.593210.tar.gz", exdir = "gdc_glandF_cancer")
untar("clinical.cart.2022-03-10.tar.gz")
sample_sheet <- read_tsv("gdc_sample_sheet.2022-03-10.tsv")
clinical <- read_tsv('clinical.tsv')
sampleTablejoin <- inner_join(sample_sheet, clinical,
by = c("Case ID" = "case_submitter_id"))
sampleTable <- sampleTablejoin %>%
dplyr::select(`Sample ID`, `File Name`, Sample_Type) %>%
distinct(`Sample ID`, .keep_all = TRUE) %>%
dplyr::rename(condition = Sample_Type)
sampleTable <- sampleTablejoin %>%
mutate(`File Name` = paste0(`File ID`, "/", `File Name`)) %>%
dplyr::select(`Sample ID`, `File Name`, Sample_Type) %>%
distinct(`Sample ID`, .keep_all = TRUE) %>%
dplyr::rename(condition = Sample_Type)
dds <- DESeqDataSetFromHTSeqCount(sampleTable = as.data.frame(sampleTable),
directory = "gdc_glandF_cancer",
design = ~condition)
vsd <- vst(dds)
plotPCA(vsd)
dds <- DESeq(dds)
resdf <- as.data.frame(results(dds, contrast = c("condition", "Metastatic", "Solid_Tissue_Normal")))
Error in h(simpleError(msg, call)) :
error in evaluating the argument 'x' in selecting a method for function 'as.data.frame': couldn't find results. you should first run DESeq()
# include your problematic code here with any corresponding output
# please also include the results of running the following in an R session
sessionInfo( )
Take it step by step :
I am taking the same error. It took from me too much time. Any help? I am a new one on this issue.
Thanks
Can you check
dds
has been correctly processed ? Please give us the output ofdds
in your consoleThe main error is here : "Error in h(simpleError(msg, call)) : error in evaluating the argument 'x' in selecting a method for function 'rowSums': cannot allocate vector of size 179.0 Mb " You ran out of memory so the
dds
object has not been created. You can trymemory.limit(size=56000)
HOW can I try memory.limit(size=56000) ? Would you clarify it, please?
Copy-paste my code, run it in your console and rerun your script
It really worked. Thank you so much
I am taking the same error. It took from me too much time. Any help? I am a new one on this issue.
Thanks
I am taking the same error. It took from me too much time. Any help? I am a new one on this issue.
Thanks