Hello,
I am trying to update my package in Bioconductor, but the vignette is having problems on Windows. The problem seems to be related with the name of the pictures, but I already solved that problem in the first version of the package and it still works fine in the other OS.
You can see the error report here: http://bioconductor.org/checkResults/devel/bioc-LATEST/sincell/moscato1-buildsrc.html
And the code of the vignette: https://hedgehog.fhcrc.org/bioconductor/trunk/madman/Rpacks/sincell/vignettes/sincell-vignette.Rnw
In the first version I could fix it adding this to the source code:
<<renaming_figures, echo=FALSE, results="hide", eval=TRUE>>=
library(stringr)
figs <- list.files("./figure", full.names=TRUE)
figs.new <- str_replace(figs, "-1", "")
file.rename(figs, figs.new )
@ %def
Does anyone know how to solve this now?
Thanks!
Miguel

And as an aside, you should reformulate this part as well:
<<install_missing_packages, eval=FALSE>>= packages<-c("entropy", "fastICA", "fields", "ggplot2", "igraph", "MASS", "proxy", "reshape2", "Rtsne", "scatterplot3d", "TSP", "abc", "abctools", "statmod") packages2install <- packages [!(packages %in% installed.packages()[, "Package"])] if(length(packages2install)>0){ for (i in 1:length(packages2install)){ install.packages(packages2install[i], dependencies = TRUE) } } @ %def Then, install sincell package from Bioconductor: <<install_sincell, eval=FALSE>>= source("http://bioconductor.org/biocLite.R") biocLite("sincell") @ %defYou should not need to manually install dependencies. The whole idea behind the BiocInstaller package (and biocLite()) is to allow people to do something like
biocLite("sincell")And have it Just Work(TM). Having unnecessary workarounds in your vignette works directly against years of effort to get people to use biocLite() rather than doing random things like what you are suggesting. Please change your vignette to use biocLite() directly!
> biocLite("sincell") package ‘colorspace’ successfully unpacked and MD5 sums checked package ‘RColorBrewer’ successfully unpacked and MD5 sums checked package ‘dichromat’ successfully unpacked and MD5 sums checked package ‘munsell’ successfully unpacked and MD5 sums checked package ‘labeling’ successfully unpacked and MD5 sums checked package ‘digest’ successfully unpacked and MD5 sums checked package ‘gtable’ successfully unpacked and MD5 sums checked package ‘scales’ successfully unpacked and MD5 sums checked package ‘proto’ successfully unpacked and MD5 sums checked package ‘spam’ successfully unpacked and MD5 sums checked package ‘maps’ successfully unpacked and MD5 sums checked package ‘igraph’ successfully unpacked and MD5 sums checked package ‘entropy’ successfully unpacked and MD5 sums checked package ‘scatterplot3d’ successfully unpacked and MD5 sums checked package ‘TSP’ successfully unpacked and MD5 sums checked package ‘ggplot2’ successfully unpacked and MD5 sums checked package ‘fields’ successfully unpacked and MD5 sums checked package ‘proxy’ successfully unpacked and MD5 sums checked package ‘Rtsne’ successfully unpacked and MD5 sums checked package ‘fastICA’ successfully unpacked and MD5 sums checked package ‘sincell’ successfully unpacked and MD5 sums checked