Hello, I would like to use the Somatic Signatures vignette.
I have downloaded the package, ran all the functions, and tried to reproduce the Use case: Estimating Somatic Signatures from TCGA WES Studies
- but I get these warnings: ( I have copied the response for each command that gives me trouble)
> library(SomaticSignatures)
Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) :
le package ‘IRanges’ 1.22.10 est déjà chargé, mais >= 1.99.28 est requis
Error: le chargement du package ou de l'espace de noms a échoué pour ‘SomaticSignatures’
> library(BSgenome.Hsapiens.UCSC.hg19)
Le chargement a nécessité le package : BSgenome
Error in gzfile(file, "rb") : cannot open the connection
In addition: Warning messages:
1: In read.dcf(file.path(p, "DESCRIPTION"), c("Package", "Version")) :
cannot open compressed file 'C:/Program Files/R/R-3.1.1/library/IRanges/DESCRIPTION', probable reason 'No such file or directory'
2: In gzfile(file, "rb") :
cannot open compressed file '', probable reason 'Invalid argument'
> sca_merge = unlist(sca_all)
Warning message:
In valid.GenomicRanges.seqinfo(x) :
'ranges' contains values outside of sequence bounds. See ?trim to subset ranges.
> sca_merge = sca_merge[ sca_merge$Variant_Type %in% "SNP" ]
Warning message:
In valid.GenomicRanges.seqinfo(x) :
'ranges' contains values outside of sequence bounds. See ?trim to subset ranges.
> sca_merge = keepSeqlevels(sca_merge, hsAutosomes())
Warning message:
In valid.GenomicRanges.seqinfo(x) :
'ranges' contains values outside of sequence bounds. See ?trim to subset ranges.
> sca_vr = VRanges(
+ seqnames(sca_merge),
+ ranges(sca_merge),
+ ref = sca_merge$Reference_Allele,
+ alt = sca_merge$Tumor_Seq_Allele2,
+ sampleNames = sca_merge$Patient_ID,
+ seqinfo = seqinfo(sca_merge),
+ study = sca_merge$study)
Warning messages:
1: In valid.GenomicRanges.seqinfo(x) :
'ranges' contains values outside of sequence bounds. See ?trim to subset ranges.
2: In valid.GenomicRanges.seqinfo(x) :
'ranges' contains values outside of sequence bounds. See ?trim to subset ranges.
> sca_motifs = mutationContext(sca_vr, BSgenome.Hsapiens.UCSC.hg19, unify = TRUE)
Error in (function (classes, fdef, mtable) :
unable to find an inherited method for function ‘granges’ for signature ‘"VRanges"’
> sca_mm = motifMatrix(sca_motifs, group = "study", normalize = TRUE)
Error in unname(vr) :
erreur d'évaluation de l'argument 'obj' lors de la sélection d'une méthode pour la fonction 'unname' : Error: object 'sca_motifs' not found
> sca_motifs = mutationContext(sca_vr, BSgenome.Hsapiens.UCSC.hg19, unify = TRUE)
Error in (function (classes, fdef, mtable) :
unable to find an inherited method for function ‘granges’ for signature ‘"VRanges"’
The session Info command gives
Error: $ operator is invalid for atomic vectors
In addition: Warning messages:
1: In FUN(c("tools", "Matrix", "graph", "gplots", "devtools", "gtools", :
le fichier DESCRIPTION du package 'VariantAnnotation' est manquant ou incorrect
2: In FUN(c("tools", "Matrix", "graph", "gplots", "devtools", "gtools", :
le fichier DESCRIPTION du package 'Rsamtools' est manquant ou incorrect
3: In FUN(c("tools", "Matrix", "graph", "gplots", "devtools", "gtools", :
le fichier DESCRIPTION du package 'Biostrings' est manquant ou incorrect
4: In FUN(c("tools", "Matrix", "graph", "gplots", "devtools", "gtools", :
le fichier DESCRIPTION du package 'XVector' est manquant ou incorrect
5: In FUN(c("tools", "Matrix", "graph", "gplots", "devtools", "gtools", :
le fichier DESCRIPTION du package 'GenomicRanges' est manquant ou incorrect
6: In FUN(c("tools", "Matrix", "graph", "gplots", "devtools", "gtools", :
le fichier DESCRIPTION du package 'IRanges' est manquant ou incorrect
Thank you in advance for your help

It seem to me that your R/bioconductor installation is seriously broken. I would recommend to consider a reinstallation.