diff --git a/NEWS.md b/NEWS.md
index 97f2d75..3ceb63f 100644
--- a/NEWS.md
+++ b/NEWS.md
@@ -1,7 +1,6 @@
# evaluate (development version)
* New `trim_intermediate_plots()` drops intermediate plots to reveal the complete/final plot (#206).
-* evaluation "chunks" now provide a function-like scope. This means that `on.exit()` will now run at the end of the evaluate code, rather than immediately and `return()` will cause the evaluation to finish (#201).
* The default `value` handler now evaluates print in a child environment of the evaluation environment. This largely makes evaluate easier to test, but should make defining S3 methods for print a little easier (#192).
* `parse_all()` adds a `\n` to the end of every line, even the last one if it didn't have one in the input.
* Setting `ACTIONS_STEP_DEBUG=1` (as in a failing GHA workflow) will automatically set `log_echo` and `log_warning` to `TRUE` (#175).
diff --git a/R/conditions.R b/R/conditions.R
index 00e5b63..9825553 100644
--- a/R/conditions.R
+++ b/R/conditions.R
@@ -51,10 +51,7 @@ with_handlers <- function(code, handlers) {
}
sanitize_call <- function(cnd) {
- if (identical(cnd$call, quote(withVisible(do)))) {
- cnd$call <- NULL
- }
- if (identical(cnd$call, quote(eval(as.call(list(context)), envir)))) {
+ if (identical(cnd$call, quote(eval(expr, envir)))) {
cnd$call <- NULL
}
diff --git a/R/evaluate.R b/R/evaluate.R
index 6f1f8d5..a424640 100644
--- a/R/evaluate.R
+++ b/R/evaluate.R
@@ -132,48 +132,34 @@ evaluate <- function(input,
# The user's condition handlers have priority over ours
handlers <- c(user_handlers, evaluate_handlers)
- context <- function() {
- do <- NULL # silence R CMD check note
-
- for (tle in tles) {
- watcher$push_source(tle$src, tle$exprs)
- if (debug || log_echo) {
- cat_line(tle$src, file = stderr())
- }
-
- continue <- withRestarts(
- with_handlers(
- {
- for (expr in tle$exprs) {
- # Using `delayedAssign()` as an interface to the C-level function
- # `Rf_eval()`. Unlike the R-level `eval()`, this doesn't create
- # an unwinding scope.
- eval(bquote(delayedAssign("do", .(expr), eval.env = envir)))
-
- ev <- withVisible(do)
- watcher$capture_plot_and_output()
- watcher$print_value(ev$value, ev$visible, envir)
- }
- TRUE
- },
- handlers
- ),
- eval_continue = function() TRUE,
- eval_stop = function() FALSE,
- eval_error = function(cnd) stop(cnd)
- )
- watcher$check_devices()
-
- if (!continue) {
- break
- }
+ for (tle in tles) {
+ watcher$push_source(tle$src, tle$exprs)
+ if (debug || log_echo) {
+ cat_line(tle$src, file = stderr())
}
- }
- # Here we use `eval()` to create an unwinding scope for `envir`.
- # We call ourselves back immediately once the scope is created.
- eval(as.call(list(context)), envir)
- watcher$capture_output()
+ continue <- withRestarts(
+ with_handlers(
+ {
+ for (expr in tle$exprs) {
+ ev <- withVisible(eval(expr, envir))
+ watcher$capture_plot_and_output()
+ watcher$print_value(ev$value, ev$visible, envir)
+ }
+ TRUE
+ },
+ handlers
+ ),
+ eval_continue = function() TRUE,
+ eval_stop = function() FALSE,
+ eval_error = function(cnd) signalCondition(cnd)
+ )
+ watcher$check_devices()
+
+ if (!continue) {
+ break
+ }
+ }
# Always capture last plot, even if incomplete
watcher$capture_plot(TRUE)
diff --git a/revdep/README.md b/revdep/README.md
index c53c171..f175d11 100644
--- a/revdep/README.md
+++ b/revdep/README.md
@@ -1,200 +1,243 @@
# Revdeps
-## Failed to check (172)
+## Failed to check (213)
-|package |version |error |warning |note |
-|:----------------------|:----------|:-----|:-------|:----|
-|ANOM |0.5 |1 | | |
-|apollo |0.3.3 |1 | | |
-|arealDB |0.6.3 |1 | | |
-|assessor |1.1.0 |1 | | |
-|AutoScore |1.0.0 |1 | | |
-|base.rms |1.0 |1 | | |
-|bayesCT |0.99.3 |1 | | |
-|bayesdfa |1.3.3 |1 | | |
-|bayesDP |1.3.6 |1 | | |
-|BayesESS |0.1.19 |1 | | |
-|BayesFactor |0.9.12-4.7 |1 | | |
-|BayesSurvive |0.0.2 |1 | | |
-|bbknnR |1.1.1 |1 | | |
-|bbmix |1.0.0 |1 | | |
-|BCClong |1.0.3 |1 | | |
-|BFpack |1.3.0 |1 | | |
-|BGGM |2.1.3 |1 | | |
-|biosensors.usc |1.0 |1 | | |
-|bmstdr |0.7.9 |1 | | |
-|bndovb |1.1 |1 | | |
-|CACIMAR |1.0.0 |1 | | |
-|CalibrationCurves |2.0.3 |1 | | |
-|caROC |0.1.5 |1 | | |
-|CaseBasedReasoning |0.3 |1 | | |
-|CGPfunctions |0.6.3 |1 | | |
-|chipPCR |1.0-2 |1 | | |
-|cmprskcoxmsm |0.2.1 |1 | | |
-|coarseDataTools |0.6-6 |1 | | |
-|COMBO |1.1.0 |1 | | |
-|ConnectednessApproach |1.0.3 |1 | | |
-|contrast |0.24.2 |1 | | |
-|cotram |0.4-4 |1 | | |
-|countSTAR |1.0.2 |1 | | |
-|coxed |0.3.3 |1 | | |
-|CSCNet |0.1.2 |1 | | |
-|csmpv |1.0.3 |1 | | |
-|ctsem |3.10.0 |1 | | |
-|cwbtools |0.4.2 |1 | | |
-|dataone |2.2.2 |1 | | |
-|datapack |1.4.1 |1 | | |
-|deeptrafo |0.1-1 |1 | | |
-|diveMove |1.6.2 |1 | | |
-|DR.SC |3.4 |1 | | |
-|drtmle |1.1.2 |1 | | |
-|ecolottery |1.0.0 |1 | | |
-|EdSurvey |4.0.7 |1 | | |
-|EpiEstim |2.2-4 |1 | | |
-|erah |2.0.1 |1 | | |
-|EWSmethods |? | | | |
-|FAIRmaterials |0.4.2.1 |1 | | |
-|FoReco |0.2.6 |1 | | |
-|FREEtree |0.1.0 |1 | | |
-|GeneNMF |0.4.0 |1 | | |
-|geomorph |? | | | |
-|gfilmm |2.0.5 |1 | | |
-|gfilogisreg |1.0.3 |1 | | |
-|ggrcs |0.4.0 |1 | | |
-|gJLS2 |0.2.0 |1 | | |
-|gllvm |1.4.3 |1 | | |
-|gmoTree |? | | | |
-|gpuR |2.0.6 |1 | | |
-|Greg |2.0.2 |1 | | |
-|hettx |0.1.3 |1 | | |
-|hIRT |0.3.0 |1 | | |
-|interactionRCS |0.1.1 |1 | | |
-|iNZightPlots |2.15.3 |1 | | |
-|IRexamples |0.0.4 |1 | | |
-|isodistrreg |0.1.0 |1 | | |
-|joineRML |0.4.6 |1 | | |
-|JWileymisc |1.4.1 |1 | | |
-|L2E |2.0 |1 | | |
-|lchemix |0.1.0 |1 | | |
-|loon.shiny |? | | | |
-|loon.tourr |? | | | |
-|LorenzRegression |1.0.0 |1 | | |
-|lsirm12pl |1.3.1 |1 | | |
-|MBmca |1.0.1-3 |1 | | |
-|mbsts |3.0 |1 | | |
-|MendelianRandomization |0.10.0 |1 | | |
-|MetabolicSurv |1.1.2 |1 | | |
-|metajam |0.3.0 |1 | | |
-|mHMMbayes |1.1.0 |1 | | |
-|miceafter |0.5.0 |1 | | |
-|MiRKAT |1.2.3 |1 | | |
-|miWQS |0.4.4 |1 | | |
-|mlt.docreg |1.1-8 |1 | | |
-|modeLLtest |1.0.4 |1 | | |
-|MRZero |0.2.0 |1 | | |
-|MultiKink |0.2.0 |1 | | |
-|multilevelTools |0.1.1 |1 | | |
-|multinma |0.7.1 |1 | | |
-|mvDFA |0.0.4 |1 | | |
-|MXM |1.5.5 |1 | | |
-|nebula |1.5.3 |1 | | |
-|NetworkChange |0.8 |1 | | |
-|newIMVC |0.1.0 |1 | | |
-|nlpred |1.0.1 |1 | | |
-|noncomplyR |1.0 |1 | | |
-|ontologics |0.7.0 |1 | | |
-|OVtool |1.0.3 |1 | | |
-|paths |0.1.1 |1 | | |
-|pencal |? | | | |
-|pez |1.2-4 |1 | | |
-|piecewiseSEM |? | | | |
-|pould |1.0.1 |1 | | |
-|pre |1.0.7 |1 | | |
-|ProFAST |? | | | |
-|PRSPGx |0.3.0 |1 | | |
-|psbcSpeedUp |2.0.7 |1 | | |
-|pscore |0.4.0 |1 | | |
-|psfmi |1.4.0 |1 | | |
-|pssmooth |1.0.3 |1 | | |
-|ptmixed |? | | | |
-|QHScrnomo |3.0.1 |1 | | |
-|qreport |1.0-1 |1 | | |
-|qte |1.3.1 |1 | | |
-|Qtools |1.5.9 |1 | | |
-|QuantileGH |? | | | |
-|quantregGrowth |1.7-1 |1 | | |
-|quid |0.0.1 |1 | | |
-|RATest |0.1.10 |1 | | |
-|rddtools |1.6.0 |1 | | |
-|rdflib |0.2.8 |1 | | |
-|redland |1.0.17-18 |1 | | |
-|rms |6.8-1 |1 | |1 |
-|rmsb |1.1-1 |1 | | |
-|robmed |1.0.2 |1 | | |
-|RPPASPACE |1.0.10 |1 | | |
-|RQdeltaCT |1.3.0 |1 | | |
-|rqPen |4.1.1 |1 | | |
-|RRPP |? | | | |
-|rstanarm |2.32.1 |1 | | |
-|scAnnotate |0.3 |1 | | |
-|scaper |0.1.0 |1 | | |
-|scCustomize |2.1.2 |1 | |1 |
-|SCdeconR |1.0.0 |1 | | |
-|scGate |1.6.2 |1 | | |
-|scGOclust |0.2.1 |1 | | |
-|SCIntRuler |0.99.6 |1 | | |
-|scMappR |1.0.11 |1 | | |
-|SCRIP |1.0.0 |1 | | |
-|SeBR |1.0.0 |1 | | |
-|semicmprskcoxmsm |0.2.0 |1 | | |
-|SGP |2.1-0.0 |1 | | |
-|shinyTempSignal |0.0.8 |1 | | |
-|shrink |1.2.3 |1 | | |
-|SimplyAgree |0.2.0 |1 | | |
-|sizeMat |1.1.2 |1 | | |
-|SNPassoc |2.1-0 |1 | | |
-|snplinkage |? | | | |
-|sorocs |0.1.0 |1 | | |
-|SortedEffects |1.7.0 |1 | | |
-|SoupX |1.6.2 |1 | | |
-|spikeSlabGAM |1.1-19 |1 | | |
-|stats4teaching |? | | | |
-|statsr |0.3.0 |1 | | |
-|stR |0.6 |1 | | |
-|STREAK |1.0.0 |1 | | |
-|streamDAG |? | | | |
-|tidyseurat |0.8.0 |1 | | |
-|tidyvpc |1.5.1 |1 | | |
-|tram |1.0-4 |1 | | |
-|tramnet |0.0-8 |1 | | |
-|tramvs |0.0-4 |1 | |1 |
-|TriDimRegression |1.0.2 |1 | | |
-|TSrepr |1.1.0 |1 | | |
-|twang |2.6 |1 | | |
-|vdg |1.2.3 |1 | | |
-|visa |0.1.0 |1 | | |
-|WRTDStidal |1.1.4 |1 | | |
-|yarrr |0.1.5 |1 | | |
-|zen4R |0.10 |1 | | |
+|package |version |error |warning |note |
+|:-----------------------|:----------|:-----|:-------|:----|
+|adjclust |? | | | |
+|ANOM |0.5 |1 | | |
+|apollo |0.3.3 |1 | | |
+|arealDB |0.6.3 |1 | | |
+|assessor |1.1.0 |1 | | |
+|AutoScore |1.0.0 |1 | | |
+|baRulho |? | | | |
+|bayesCT |0.99.3 |1 | | |
+|bayesDP |1.3.6 |1 | | |
+|BayesESS |0.1.19 |1 | | |
+|BayesFactor |0.9.12-4.7 |1 | | |
+|BayesSurvive |0.0.2 |1 | | |
+|bbknnR |1.1.1 |1 | | |
+|bbmix |1.0.0 |1 | | |
+|BCClong |1.0.3 |1 | | |
+|BFpack |1.3.0 |1 | | |
+|BGGM |2.1.3 |1 | | |
+|biosensors.usc |1.0 |1 | | |
+|bmstdr |0.7.9 |1 | | |
+|bndovb |1.1 |1 | | |
+|bsub |1.1.0 |1 | | |
+|CACIMAR |1.0.0 |1 | | |
+|caROC |0.1.5 |1 | | |
+|CGPfunctions |0.6.3 |1 | | |
+|chemodiv |? | | | |
+|chicane |? | | | |
+|chipPCR |1.0-2 |1 | | |
+|cinaR |? | | | |
+|cmprskcoxmsm |0.2.1 |1 | | |
+|CNVScope |? | | | |
+|coarseDataTools |0.6-6 |1 | | |
+|COMBO |1.1.0 |1 | | |
+|COMMA |1.0.0 |1 | | |
+|ConnectednessApproach |1.0.3 |1 | | |
+|conos |? | | | |
+|cotram |? | | | |
+|countSTAR |1.0.2 |1 | | |
+|crosstalkr |? | | | |
+|CSCNet |0.1.2 |1 | | |
+|ctsem |3.10.1 |1 | | |
+|dataone |2.2.2 |1 | | |
+|datapack |1.4.1 |1 | | |
+|deeptrafo |? | | | |
+|diveMove |1.6.2 |1 | | |
+|do |2.0.0.0 |1 | | |
+|DR.SC |3.4 |1 | | |
+|driveR |? | | | |
+|drtmle |1.1.2 |1 | | |
+|DrugSim2DR |? | | | |
+|DRviaSPCN |? | | | |
+|ech |0.1.3 |1 | | |
+|EcoEnsemble |1.1.0 |1 | | |
+|ecolottery |1.0.0 |1 | | |
+|EdSurvey |4.0.7 |1 | | |
+|EpiEstim |2.2-4 |1 | | |
+|erah |2.0.1 |1 | | |
+|EWSmethods |? | | | |
+|FAIRmaterials |0.4.2.1 |1 | | |
+|FREEtree |0.1.0 |1 | | |
+|GALLO |? | | | |
+|gap |? | | | |
+|geneHapR |? | | | |
+|GeneNMF |0.6.0 |1 | | |
+|GeneSelectR |? | | | |
+|geomorph |? | | | |
+|gJLS2 |0.2.0 |1 | | |
+|gllvm |1.4.3 |1 | | |
+|gmoTree |? | | | |
+|gpuR |2.0.6 |1 | | |
+|hettx |0.1.3 |1 | | |
+|Hmisc |? | | | |
+|iClusterVB |0.1.2 |1 | | |
+|iNZightPlots |2.15.3 |1 | | |
+|IRexamples |0.0.4 |1 | | |
+|isodistrreg |0.1.0 |1 | | |
+|joineRML |0.4.6 |1 | | |
+|kdml |1.0.0 |1 | | |
+|kibior |? | | | |
+|kstMatrix |? | | | |
+|L2E |2.0 |1 | | |
+|lchemix |0.1.0 |1 | | |
+|ldsep |? | | | |
+|locuszoomr |? | | | |
+|loon.shiny |? | | | |
+|loon.tourr |? | | | |
+|LorenzRegression |1.0.0 |1 | | |
+|lsirm12pl |1.3.3 |1 | | |
+|MAAPER |? | | | |
+|marlod |0.1.1 |1 | | |
+|MARVEL |? | | | |
+|MBmca |1.0.1-3 |1 | | |
+|mbsts |3.0 |1 | | |
+|Mega2R |? | | | |
+|metajam |0.3.1 |1 | | |
+|mHMMbayes |1.1.0 |1 | | |
+|MicroSEC |? | | | |
+|MiRKAT |1.2.3 |1 | | |
+|MitoHEAR |? | | | |
+|miWQS |0.4.4 |1 | | |
+|MLML2R |? | | | |
+|mlt.docreg |? | | | |
+|MOCHA |? | | | |
+|modeLLtest |1.0.4 |1 | | |
+|MRZero |0.2.0 |1 | | |
+|MultiKink |0.2.0 |1 | | |
+|multilevelTools |0.1.1 |1 | | |
+|multinma |0.7.1 |1 | | |
+|mvDFA |0.0.4 |1 | | |
+|MXM |1.5.5 |1 | | |
+|nebula |1.5.3 |1 | | |
+|NetworkChange |0.8 |1 | | |
+|newIMVC |0.1.0 |1 | | |
+|nlpred |1.0.1 |1 | | |
+|noncomplyR |1.0 |1 | | |
+|ohun |? | | | |
+|oncoPredict |? | | | |
+|ontologics |0.7.0 |1 | | |
+|OVtool |1.0.3 |1 | | |
+|pagoda2 |? | | | |
+|PAMpal |1.2.1 |1 | | |
+|paths |0.1.1 |1 | | |
+|PathwaySpace |? | | | |
+|pencal |? | | | |
+|pez |1.2-4 |1 | | |
+|piecewiseSEM |? | | | |
+|polyRAD |? | | | |
+|pould |1.0.1 |1 | | |
+|pre |1.0.7 |1 | | |
+|ProFAST |? | | | |
+|PRSPGx |0.3.0 |1 | | |
+|psbcSpeedUp |2.0.7 |1 | | |
+|pscore |0.4.0 |1 | | |
+|pssmooth |1.0.3 |1 | | |
+|ptmixed |? | | | |
+|qte |1.3.1 |1 | | |
+|Qtools |1.5.9 |1 | | |
+|QuantileGH |? | | | |
+|quantilogram |3.1.1 |1 | | |
+|quantregGrowth |1.7-1 |1 | | |
+|quid |0.0.1 |1 | | |
+|RATest |0.1.10 |1 | | |
+|rddtools |1.6.0 |1 | | |
+|rdflib |0.2.9 |1 | | |
+|redland |1.0.17-18 |1 | | |
+|revert |? | | | |
+|RFLPtools |? | | | |
+|Rgff |? | | | |
+|RGraphSpace |? | | | |
+|rms |? | | | |
+|RNAseqQC |? | | | |
+|robmed |1.0.2 |1 | | |
+|RPPASPACE |1.0.10 |1 | | |
+|RQdeltaCT |1.3.0 |1 | | |
+|rqPen |4.1.1 |1 | | |
+|Rraven |? | | | |
+|RRPP |? | | | |
+|rsolr |? | | | |
+|rstanarm |2.32.1 |1 | | |
+|RTIGER |? | | | |
+|rTwig |1.1.0 |1 | | |
+|RVA |? | | | |
+|scAnnotate |0.3 |1 | | |
+|scaper |0.1.0 |1 | | |
+|scCustomize |? | | | |
+|SCdeconR |1.0.0 |1 | | |
+|scGate |1.6.2 |1 | | |
+|scGOclust |0.2.1 |1 | | |
+|SCIntRuler |0.99.6 |1 | | |
+|scITD |? | | | |
+|scMappR |1.0.11 |1 | | |
+|SCRIP |1.0.0 |1 | | |
+|SeBR |1.0.0 |1 | | |
+|SeedMatchR |? | | | |
+|semicmprskcoxmsm |0.2.0 |1 | | |
+|SGP |2.1-0.0 |1 | | |
+|shinyTempSignal |0.0.8 |1 | | |
+|sigminer |? | | | |
+|SimplyAgree |0.2.0 |1 | | |
+|sizeMat |1.1.2 |1 | | |
+|SNPassoc |? | | | |
+|snplinkage |? | | | |
+|sorocs |0.1.0 |1 | | |
+|SortedEffects |1.7.0 |1 | | |
+|SoupX |1.6.2 |1 | | |
+|SpatialDDLS |? | | | |
+|speakeasyR |? | | | |
+|spikeSlabGAM |1.1-19 |1 | | |
+|stats4teaching |? | | | |
+|statsr |0.3.0 |1 | | |
+|stR |0.7 |1 | | |
+|STREAK |1.0.0 |1 | | |
+|streamDAG |? | | | |
+|SubtypeDrug |? | | | |
+|tbm |? | | | |
+|TH.data |? | | | |
+|tidyseurat |0.8.0 |1 | | |
+|tidyvpc |1.5.1 |1 | | |
+|tram |? | | | |
+|tramME |? | | | |
+|tramnet |? | | | |
+|tramvs |? | | | |
+|TriDimRegression |1.0.2 |1 | | |
+|TSrepr |1.1.0 |1 | | |
+|twang |2.6.1 |1 | | |
+|TwitterAutomatedTrading |0.1.0 |1 | | |
+|updog |? | | | |
+|valr |? | | | |
+|vdg |1.2.3 |1 | | |
+|visa |0.1.0 |1 | | |
+|WRTDStidal |1.1.4 |1 | | |
+|xnet |? | | | |
+|yarrr |0.1.5 |1 | | |
+|zen4R |0.10 |1 | | |
-## New problems (16)
+## New problems (18)
|package |version |error |warning |note |
|:-------------|:-------|:------|:-------|:--------|
|[babelmixr2](problems.md#babelmixr2)|0.1.2 | | |1 __+1__ |
-|[CGGP](problems.md#cggp)|1.0.4 |__+1__ | | |
-|[circhelp](problems.md#circhelp)|1.1 |__+1__ | | |
+|[BeeGUTS](problems.md#beeguts)|1.1.3 | | |2 __+1__ |
|[coro](problems.md#coro)|1.0.4 |__+1__ | | |
-|[Haplin](problems.md#haplin)|7.3.1 | | |__+1__ |
+|[etwfe](problems.md#etwfe)|0.4.0 | | |__+1__ |
+|[fauxpas](problems.md#fauxpas)|0.5.2 | | |__+1__ |
|[multiverse](problems.md#multiverse)|0.6.1 |1 | |__+1__ |
|[OptimModel](problems.md#optimmodel)|2.0-1 | | |__+1__ |
-|[polmineR](problems.md#polminer)|0.8.9 | | |__+1__ |
+|[ordinalbayes](problems.md#ordinalbayes)|0.1.1 | | |1 __+1__ |
|[PopED](problems.md#poped)|0.6.0 |1 | |1 __+1__ |
-|[PubChemR](problems.md#pubchemr)|2.0 |__+2__ | | |
-|[refer](problems.md#refer)|0.1.0 | | |__+1__ |
+|[posologyr](problems.md#posologyr)|1.2.6 | | |__+1__ |
+|[rgho](problems.md#rgho)|3.0.2 |__+1__ | | |
+|[rTensor2](problems.md#rtensor2)|2.0.0 | | |__+1__ |
|[rxode2](problems.md#rxode2)|2.1.3 |__+1__ | |1 |
|[spathial](problems.md#spathial)|0.1.2 | | |2 __+1__ |
|[trampoline](problems.md#trampoline)|0.1.1 |1 | |__+1__ |
+|[treesliceR](problems.md#treeslicer)|1.0.2 |__+1__ | | |
|[WindCurves](problems.md#windcurves)|0.2 | | |__+1__ |
|[wordpredictor](problems.md#wordpredictor)|0.0.3 |1 | |__+1__ |
diff --git a/revdep/cran.md b/revdep/cran.md
index 73056ac..d7e5202 100644
--- a/revdep/cran.md
+++ b/revdep/cran.md
@@ -1,9 +1,9 @@
## revdepcheck results
-We checked 8733 reverse dependencies (8727 from CRAN + 6 from Bioconductor), comparing R CMD check results across CRAN and dev versions of this package.
+We checked 8826 reverse dependencies (8816 from CRAN + 10 from Bioconductor), comparing R CMD check results across CRAN and dev versions of this package.
- * We saw 16 new problems
- * We failed to check 166 packages
+ * We saw 18 new problems
+ * We failed to check 203 packages
Issues with CRAN packages are summarised below.
@@ -13,16 +13,16 @@ Issues with CRAN packages are summarised below.
* babelmixr2
checking re-building of vignette outputs ... NOTE
-* CGGP
- checking tests ... ERROR
-
-* circhelp
- checking tests ... ERROR
+* BeeGUTS
+ checking re-building of vignette outputs ... NOTE
* coro
checking tests ... ERROR
-* Haplin
+* etwfe
+ checking re-building of vignette outputs ... NOTE
+
+* fauxpas
checking installed package size ... NOTE
* multiverse
@@ -31,18 +31,20 @@ Issues with CRAN packages are summarised below.
* OptimModel
checking re-building of vignette outputs ... NOTE
-* polmineR
+* ordinalbayes
checking installed package size ... NOTE
* PopED
checking re-building of vignette outputs ... NOTE
-* PubChemR
+* posologyr
+ checking re-building of vignette outputs ... NOTE
+
+* rgho
checking tests ... ERROR
- checking running R code from vignettes ... ERROR
-* refer
- checking re-building of vignette outputs ... NOTE
+* rTensor2
+ checking installed package size ... NOTE
* rxode2
checking re-building of vignette outputs ... ERROR
@@ -53,6 +55,9 @@ Issues with CRAN packages are summarised below.
* trampoline
checking re-building of vignette outputs ... NOTE
+* treesliceR
+ checking tests ... ERROR
+
* WindCurves
checking re-building of vignette outputs ... NOTE
@@ -61,169 +66,206 @@ Issues with CRAN packages are summarised below.
### Failed to check
-* ANOM (NA)
-* apollo (NA)
-* arealDB (NA)
-* assessor (NA)
-* AutoScore (NA)
-* base.rms (NA)
-* bayesCT (NA)
-* bayesdfa (NA)
-* bayesDP (NA)
-* BayesESS (NA)
-* BayesFactor (NA)
-* BayesSurvive (NA)
-* bbknnR (NA)
-* bbmix (NA)
-* BCClong (NA)
-* BFpack (NA)
-* BGGM (NA)
-* biosensors.usc (NA)
-* bmstdr (NA)
-* bndovb (NA)
-* CACIMAR (NA)
-* CalibrationCurves (NA)
-* caROC (NA)
-* CaseBasedReasoning (NA)
-* CGPfunctions (NA)
-* chipPCR (NA)
-* cmprskcoxmsm (NA)
-* coarseDataTools (NA)
-* COMBO (NA)
-* ConnectednessApproach (NA)
-* contrast (NA)
-* cotram (NA)
-* countSTAR (NA)
-* coxed (NA)
-* CSCNet (NA)
-* csmpv (NA)
-* ctsem (NA)
-* cwbtools (NA)
-* dataone (NA)
-* datapack (NA)
-* deeptrafo (NA)
-* diveMove (NA)
-* DR.SC (NA)
-* drtmle (NA)
-* ecolottery (NA)
-* EdSurvey (NA)
-* EpiEstim (NA)
-* erah (NA)
-* FAIRmaterials (NA)
-* FoReco (NA)
-* FREEtree (NA)
-* GeneNMF (NA)
-* gfilmm (NA)
-* gfilogisreg (NA)
-* ggrcs (NA)
-* gJLS2 (NA)
-* gllvm (NA)
-* gpuR (NA)
-* Greg (NA)
-* hettx (NA)
-* hIRT (NA)
-* interactionRCS (NA)
-* iNZightPlots (NA)
-* IRexamples (NA)
-* isodistrreg (NA)
-* joineRML (NA)
-* JWileymisc (NA)
-* L2E (NA)
-* lchemix (NA)
-* loon.shiny (NA)
-* loon.tourr (NA)
-* LorenzRegression (NA)
-* lsirm12pl (NA)
-* MBmca (NA)
-* mbsts (NA)
-* MendelianRandomization (NA)
-* MetabolicSurv (NA)
-* metajam (NA)
-* mHMMbayes (NA)
-* miceafter (NA)
-* MiRKAT (NA)
-* miWQS (NA)
-* mlt.docreg (NA)
-* modeLLtest (NA)
-* MRZero (NA)
-* MultiKink (NA)
-* multilevelTools (NA)
-* multinma (NA)
-* mvDFA (NA)
-* MXM (NA)
-* nebula (NA)
-* NetworkChange (NA)
-* newIMVC (NA)
-* nlpred (NA)
-* noncomplyR (NA)
-* ontologics (NA)
-* OVtool (NA)
-* paths (NA)
-* pencal (NA)
-* pez (NA)
-* pould (NA)
-* pre (NA)
-* ProFAST (NA)
-* PRSPGx (NA)
-* psbcSpeedUp (NA)
-* pscore (NA)
-* psfmi (NA)
-* pssmooth (NA)
-* ptmixed (NA)
-* QHScrnomo (NA)
-* qreport (NA)
-* qte (NA)
-* Qtools (NA)
-* quantregGrowth (NA)
-* quid (NA)
-* RATest (NA)
-* rddtools (NA)
-* rdflib (NA)
-* redland (NA)
-* rms (NA)
-* rmsb (NA)
-* robmed (NA)
-* RPPASPACE (NA)
-* RQdeltaCT (NA)
-* rqPen (NA)
-* rstanarm (NA)
-* scAnnotate (NA)
-* scaper (NA)
-* scCustomize (NA)
-* SCdeconR (NA)
-* scGate (NA)
-* scGOclust (NA)
-* SCIntRuler (NA)
-* scMappR (NA)
-* SCRIP (NA)
-* SeBR (NA)
-* semicmprskcoxmsm (NA)
-* SGP (NA)
-* shinyTempSignal (NA)
-* shrink (NA)
-* SimplyAgree (NA)
-* sizeMat (NA)
-* SNPassoc (NA)
-* snplinkage (NA)
-* sorocs (NA)
-* SortedEffects (NA)
-* SoupX (NA)
-* spikeSlabGAM (NA)
-* stats4teaching (NA)
-* statsr (NA)
-* stR (NA)
-* STREAK (NA)
-* streamDAG (NA)
-* tidyseurat (NA)
-* tidyvpc (NA)
-* tram (NA)
-* tramnet (NA)
-* tramvs (NA)
-* TriDimRegression (NA)
-* TSrepr (NA)
-* twang (NA)
-* vdg (NA)
-* visa (NA)
-* WRTDStidal (NA)
-* yarrr (NA)
-* zen4R (NA)
+* adjclust (NA)
+* ANOM (NA)
+* apollo (NA)
+* arealDB (NA)
+* assessor (NA)
+* AutoScore (NA)
+* baRulho (NA)
+* bayesCT (NA)
+* bayesDP (NA)
+* BayesESS (NA)
+* BayesFactor (NA)
+* BayesSurvive (NA)
+* bbknnR (NA)
+* bbmix (NA)
+* BCClong (NA)
+* BFpack (NA)
+* BGGM (NA)
+* biosensors.usc (NA)
+* bmstdr (NA)
+* bndovb (NA)
+* bsub (NA)
+* CACIMAR (NA)
+* caROC (NA)
+* CGPfunctions (NA)
+* chemodiv (NA)
+* chicane (NA)
+* chipPCR (NA)
+* cinaR (NA)
+* cmprskcoxmsm (NA)
+* CNVScope (NA)
+* coarseDataTools (NA)
+* COMBO (NA)
+* COMMA (NA)
+* ConnectednessApproach (NA)
+* conos (NA)
+* cotram (NA)
+* countSTAR (NA)
+* crosstalkr (NA)
+* CSCNet (NA)
+* ctsem (NA)
+* dataone (NA)
+* datapack (NA)
+* deeptrafo (NA)
+* diveMove (NA)
+* do (NA)
+* DR.SC (NA)
+* driveR (NA)
+* drtmle (NA)
+* DrugSim2DR (NA)
+* DRviaSPCN (NA)
+* ech (NA)
+* EcoEnsemble (NA)
+* ecolottery (NA)
+* EdSurvey (NA)
+* EpiEstim (NA)
+* erah (NA)
+* FAIRmaterials (NA)
+* FREEtree (NA)
+* GALLO (NA)
+* gap (NA)
+* geneHapR (NA)
+* GeneNMF (NA)
+* GeneSelectR (NA)
+* gJLS2 (NA)
+* gllvm (NA)
+* gpuR (NA)
+* hettx (NA)
+* Hmisc (NA)
+* iClusterVB (NA)
+* iNZightPlots (NA)
+* IRexamples (NA)
+* isodistrreg (NA)
+* joineRML (NA)
+* kdml (NA)
+* kibior (NA)
+* L2E (NA)
+* lchemix (NA)
+* ldsep (NA)
+* locuszoomr (NA)
+* loon.shiny (NA)
+* loon.tourr (NA)
+* LorenzRegression (NA)
+* lsirm12pl (NA)
+* MAAPER (NA)
+* marlod (NA)
+* MARVEL (NA)
+* MBmca (NA)
+* mbsts (NA)
+* Mega2R (NA)
+* metajam (NA)
+* mHMMbayes (NA)
+* MicroSEC (NA)
+* MiRKAT (NA)
+* MitoHEAR (NA)
+* miWQS (NA)
+* MLML2R (NA)
+* mlt.docreg (NA)
+* MOCHA (NA)
+* modeLLtest (NA)
+* MRZero (NA)
+* MultiKink (NA)
+* multilevelTools (NA)
+* multinma (NA)
+* mvDFA (NA)
+* MXM (NA)
+* nebula (NA)
+* NetworkChange (NA)
+* newIMVC (NA)
+* nlpred (NA)
+* noncomplyR (NA)
+* ohun (NA)
+* oncoPredict (NA)
+* ontologics (NA)
+* OVtool (NA)
+* pagoda2 (NA)
+* PAMpal (NA)
+* paths (NA)
+* pencal (NA)
+* pez (NA)
+* polyRAD (NA)
+* pould (NA)
+* pre (NA)
+* ProFAST (NA)
+* PRSPGx (NA)
+* psbcSpeedUp (NA)
+* pscore (NA)
+* pssmooth (NA)
+* ptmixed (NA)
+* qte (NA)
+* Qtools (NA)
+* quantilogram (NA)
+* quantregGrowth (NA)
+* quid (NA)
+* RATest (NA)
+* rddtools (NA)
+* rdflib (NA)
+* redland (NA)
+* revert (NA)
+* RFLPtools (NA)
+* Rgff (NA)
+* RNAseqQC (NA)
+* robmed (NA)
+* RPPASPACE (NA)
+* RQdeltaCT (NA)
+* rqPen (NA)
+* Rraven (NA)
+* rsolr (NA)
+* rstanarm (NA)
+* RTIGER (NA)
+* rTwig (NA)
+* RVA (NA)
+* scAnnotate (NA)
+* scaper (NA)
+* scCustomize (NA)
+* SCdeconR (NA)
+* scGate (NA)
+* scGOclust (NA)
+* SCIntRuler (NA)
+* scITD (NA)
+* scMappR (NA)
+* SCRIP (NA)
+* SeBR (NA)
+* SeedMatchR (NA)
+* semicmprskcoxmsm (NA)
+* SGP (NA)
+* shinyTempSignal (NA)
+* sigminer (NA)
+* SimplyAgree (NA)
+* sizeMat (NA)
+* SNPassoc (NA)
+* snplinkage (NA)
+* sorocs (NA)
+* SortedEffects (NA)
+* SoupX (NA)
+* SpatialDDLS (NA)
+* speakeasyR (NA)
+* spikeSlabGAM (NA)
+* stats4teaching (NA)
+* statsr (NA)
+* stR (NA)
+* STREAK (NA)
+* streamDAG (NA)
+* SubtypeDrug (NA)
+* tbm (NA)
+* TH.data (NA)
+* tidyseurat (NA)
+* tidyvpc (NA)
+* tram (NA)
+* tramME (NA)
+* tramnet (NA)
+* tramvs (NA)
+* TriDimRegression (NA)
+* TSrepr (NA)
+* twang (NA)
+* TwitterAutomatedTrading (NA)
+* updog (NA)
+* valr (NA)
+* vdg (NA)
+* visa (NA)
+* WRTDStidal (NA)
+* xnet (NA)
+* yarrr (NA)
+* zen4R (NA)
diff --git a/revdep/failures.md b/revdep/failures.md
index c2e558c..d7c7821 100644
--- a/revdep/failures.md
+++ b/revdep/failures.md
@@ -1,3 +1,79 @@
+# adjclust
+
+
+
+* Version: 0.6.9
+* GitHub: https://github.com/pneuvial/adjclust
+* Source code: https://github.com/cran/adjclust
+* Date/Publication: 2024-02-08 08:50:05 UTC
+* Number of recursive dependencies: 119
+
+Run `revdepcheck::cloud_details(, "adjclust")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/adjclust/new/adjclust.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘adjclust/DESCRIPTION’ ... OK
+...
+ When sourcing ‘hicClust.R’:
+Error: there is no package called ‘HiTC’
+Execution halted
+
+ ‘hicClust.Rmd’ using ‘UTF-8’... failed
+ ‘notesCHAC.Rmd’ using ‘UTF-8’... OK
+ ‘snpClust.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 WARNING, 2 NOTEs
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/adjclust/old/adjclust.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘adjclust/DESCRIPTION’ ... OK
+...
+ When sourcing ‘hicClust.R’:
+Error: there is no package called ‘HiTC’
+Execution halted
+
+ ‘hicClust.Rmd’ using ‘UTF-8’... failed
+ ‘notesCHAC.Rmd’ using ‘UTF-8’... OK
+ ‘snpClust.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 WARNING, 2 NOTEs
+
+
+
+
+
+```
# ANOM
@@ -300,8 +376,8 @@ Run `revdepcheck::cloud_details(, "AutoScore")` for more info
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+ there is no package called ‘rms’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
ERROR: lazy loading failed for package ‘AutoScore’
* removing ‘/tmp/workdir/AutoScore/new/AutoScore.Rcheck/AutoScore’
@@ -320,71 +396,87 @@ ERROR: lazy loading failed for package ‘AutoScore’
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+ there is no package called ‘rms’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
ERROR: lazy loading failed for package ‘AutoScore’
* removing ‘/tmp/workdir/AutoScore/old/AutoScore.Rcheck/AutoScore’
```
-# base.rms
+# baRulho
-* Version: 1.0
-* GitHub: NA
-* Source code: https://github.com/cran/base.rms
-* Date/Publication: 2020-08-01 11:10:08 UTC
-* Number of recursive dependencies: 110
+* Version: 2.1.2
+* GitHub: https://github.com/ropensci/baRulho
+* Source code: https://github.com/cran/baRulho
+* Date/Publication: 2024-08-31 13:10:07 UTC
+* Number of recursive dependencies: 115
-Run `revdepcheck::cloud_details(, "base.rms")` for more info
+Run `revdepcheck::cloud_details(, "baRulho")` for more info
-## In both
-
-* checking whether package ‘base.rms’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/base.rms/new/base.rms.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘base.rms’ ...
-** package ‘base.rms’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘base.rms’
-* removing ‘/tmp/workdir/base.rms/new/base.rms.Rcheck/base.rms’
+* using log directory ‘/tmp/workdir/baRulho/new/baRulho.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘baRulho/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'warbleR', 'ohun'
+
+Package suggested but not available for checking: ‘Rraven’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘base.rms’ ...
-** package ‘base.rms’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘base.rms’
-* removing ‘/tmp/workdir/base.rms/old/base.rms.Rcheck/base.rms’
+* using log directory ‘/tmp/workdir/baRulho/old/baRulho.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘baRulho/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'warbleR', 'ohun'
+
+Package suggested but not available for checking: ‘Rraven’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
@@ -451,84 +543,6 @@ ERROR: lazy loading failed for package ‘bayesCT’
* removing ‘/tmp/workdir/bayesCT/old/bayesCT.Rcheck/bayesCT’
-```
-# bayesdfa
-
-
-
-* Version: 1.3.3
-* GitHub: https://github.com/fate-ewi/bayesdfa
-* Source code: https://github.com/cran/bayesdfa
-* Date/Publication: 2024-02-26 20:50:06 UTC
-* Number of recursive dependencies: 89
-
-Run `revdepcheck::cloud_details(, "bayesdfa")` for more info
-
-
-
-## In both
-
-* checking whether package ‘bayesdfa’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/bayesdfa/new/bayesdfa.Rcheck/00install.out’ for details.
- ```
-
-## Installation
-
-### Devel
-
-```
-* installing *source* package ‘bayesdfa’ ...
-** package ‘bayesdfa’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using C++17
-
-
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-In file included from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205,
-...
-/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_dfa_namespace::model_dfa; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’
-/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here
-/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes]
- 654 | return internal::first_aligned::alignment),Derived>(m);
- | ^~~~~~~~~
-g++: fatal error: Killed signal terminated program cc1plus
-compilation terminated.
-make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_dfa.o] Error 1
-ERROR: compilation failed for package ‘bayesdfa’
-* removing ‘/tmp/workdir/bayesdfa/new/bayesdfa.Rcheck/bayesdfa’
-
-
-```
-### CRAN
-
-```
-* installing *source* package ‘bayesdfa’ ...
-** package ‘bayesdfa’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using C++17
-
-
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-In file included from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205,
-...
-/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_dfa_namespace::model_dfa; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’
-/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here
-/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes]
- 654 | return internal::first_aligned::alignment),Derived>(m);
- | ^~~~~~~~~
-g++: fatal error: Killed signal terminated program cc1plus
-compilation terminated.
-make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_dfa.o] Error 1
-ERROR: compilation failed for package ‘bayesdfa’
-* removing ‘/tmp/workdir/bayesdfa/old/bayesdfa.Rcheck/bayesdfa’
-
-
```
# bayesDP
@@ -768,7 +782,7 @@ ERROR: lazy loading failed for package ‘BayesFactor’
* GitHub: https://github.com/ocbe-uio/BayesSurvive
* Source code: https://github.com/cran/BayesSurvive
* Date/Publication: 2024-06-04 13:20:12 UTC
-* Number of recursive dependencies: 128
+* Number of recursive dependencies: 129
Run `revdepcheck::cloud_details(, "BayesSurvive")` for more info
@@ -803,8 +817,8 @@ checking whether g++ -std=gnu++17 accepts -g... yes
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+ there is no package called ‘rms’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
ERROR: lazy loading failed for package ‘BayesSurvive’
* removing ‘/tmp/workdir/BayesSurvive/new/BayesSurvive.Rcheck/BayesSurvive’
@@ -830,8 +844,8 @@ checking whether g++ -std=gnu++17 accepts -g... yes
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+ there is no package called ‘rms’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
ERROR: lazy loading failed for package ‘BayesSurvive’
* removing ‘/tmp/workdir/BayesSurvive/old/BayesSurvive.Rcheck/BayesSurvive’
@@ -1132,7 +1146,7 @@ ERROR: lazy loading failed for package ‘BFpack’
* GitHub: https://github.com/donaldRwilliams/BGGM
* Source code: https://github.com/cran/BGGM
* Date/Publication: 2024-07-05 20:30:02 UTC
-* Number of recursive dependencies: 208
+* Number of recursive dependencies: 209
Run `revdepcheck::cloud_details(, "BGGM")` for more info
@@ -1282,7 +1296,7 @@ ERROR: lazy loading failed for package ‘biosensors.usc’
* GitHub: https://github.com/sujit-sahu/bmstdr
* Source code: https://github.com/cran/bmstdr
* Date/Publication: 2023-12-18 15:00:02 UTC
-* Number of recursive dependencies: 215
+* Number of recursive dependencies: 216
Run `revdepcheck::cloud_details(, "bmstdr")` for more info
@@ -1416,26 +1430,26 @@ ERROR: lazy loading failed for package ‘bndovb’
```
-# CACIMAR
+# bsub
-* Version: 1.0.0
-* GitHub: https://github.com/jiang-junyao/CACIMAR
-* Source code: https://github.com/cran/CACIMAR
-* Date/Publication: 2022-05-18 08:20:02 UTC
-* Number of recursive dependencies: 162
+* Version: 1.1.0
+* GitHub: https://github.com/jokergoo/bsub
+* Source code: https://github.com/cran/bsub
+* Date/Publication: 2021-07-01 15:50:10 UTC
+* Number of recursive dependencies: 79
-Run `revdepcheck::cloud_details(, "CACIMAR")` for more info
+Run `revdepcheck::cloud_details(, "bsub")` for more info
## In both
-* checking whether package ‘CACIMAR’ can be installed ... ERROR
+* checking whether package ‘bsub’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/CACIMAR/new/CACIMAR.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/bsub/new/bsub.Rcheck/00install.out’ for details.
```
## Installation
@@ -1443,61 +1457,59 @@ Run `revdepcheck::cloud_details(, "CACIMAR")` for more info
### Devel
```
-* installing *source* package ‘CACIMAR’ ...
-** package ‘CACIMAR’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘bsub’ ...
+** package ‘bsub’ successfully unpacked and MD5 sums checked
** using staged installation
** R
-** data
-*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ there is no package called ‘rjson’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
-ERROR: lazy loading failed for package ‘CACIMAR’
-* removing ‘/tmp/workdir/CACIMAR/new/CACIMAR.Rcheck/CACIMAR’
+ERROR: lazy loading failed for package ‘bsub’
+* removing ‘/tmp/workdir/bsub/new/bsub.Rcheck/bsub’
```
### CRAN
```
-* installing *source* package ‘CACIMAR’ ...
-** package ‘CACIMAR’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘bsub’ ...
+** package ‘bsub’ successfully unpacked and MD5 sums checked
** using staged installation
** R
-** data
-*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ there is no package called ‘rjson’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
-ERROR: lazy loading failed for package ‘CACIMAR’
-* removing ‘/tmp/workdir/CACIMAR/old/CACIMAR.Rcheck/CACIMAR’
+ERROR: lazy loading failed for package ‘bsub’
+* removing ‘/tmp/workdir/bsub/old/bsub.Rcheck/bsub’
```
-# CalibrationCurves
+# CACIMAR
-* Version: 2.0.3
-* GitHub: NA
-* Source code: https://github.com/cran/CalibrationCurves
-* Date/Publication: 2024-07-02 08:50:02 UTC
-* Number of recursive dependencies: 78
+* Version: 1.0.0
+* GitHub: https://github.com/jiang-junyao/CACIMAR
+* Source code: https://github.com/cran/CACIMAR
+* Date/Publication: 2022-05-18 08:20:02 UTC
+* Number of recursive dependencies: 162
-Run `revdepcheck::cloud_details(, "CalibrationCurves")` for more info
+Run `revdepcheck::cloud_details(, "CACIMAR")` for more info
## In both
-* checking whether package ‘CalibrationCurves’ can be installed ... ERROR
+* checking whether package ‘CACIMAR’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/CalibrationCurves/new/CalibrationCurves.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/CACIMAR/new/CACIMAR.Rcheck/00install.out’ for details.
```
## Installation
@@ -1505,38 +1517,38 @@ Run `revdepcheck::cloud_details(, "CalibrationCurves")` for more info
### Devel
```
-* installing *source* package ‘CalibrationCurves’ ...
-** package ‘CalibrationCurves’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘CACIMAR’ ...
+** package ‘CACIMAR’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘rms’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
+ namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required
Execution halted
-ERROR: lazy loading failed for package ‘CalibrationCurves’
-* removing ‘/tmp/workdir/CalibrationCurves/new/CalibrationCurves.Rcheck/CalibrationCurves’
+ERROR: lazy loading failed for package ‘CACIMAR’
+* removing ‘/tmp/workdir/CACIMAR/new/CACIMAR.Rcheck/CACIMAR’
```
### CRAN
```
-* installing *source* package ‘CalibrationCurves’ ...
-** package ‘CalibrationCurves’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘CACIMAR’ ...
+** package ‘CACIMAR’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘rms’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
+ namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required
Execution halted
-ERROR: lazy loading failed for package ‘CalibrationCurves’
-* removing ‘/tmp/workdir/CalibrationCurves/old/CalibrationCurves.Rcheck/CalibrationCurves’
+ERROR: lazy loading failed for package ‘CACIMAR’
+* removing ‘/tmp/workdir/CACIMAR/old/CACIMAR.Rcheck/CACIMAR’
```
@@ -1598,85 +1610,7 @@ ERROR: lazy loading failed for package ‘caROC’
```
-# CaseBasedReasoning
-
-
-
-* Version: 0.3
-* GitHub: https://github.com/sipemu/case-based-reasoning
-* Source code: https://github.com/cran/CaseBasedReasoning
-* Date/Publication: 2023-05-02 08:40:02 UTC
-* Number of recursive dependencies: 106
-
-Run `revdepcheck::cloud_details(, "CaseBasedReasoning")` for more info
-
-
-
-## In both
-
-* checking whether package ‘CaseBasedReasoning’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/CaseBasedReasoning/new/CaseBasedReasoning.Rcheck/00install.out’ for details.
- ```
-
-## Installation
-
-### Devel
-
-```
-* installing *source* package ‘CaseBasedReasoning’ ...
-** package ‘CaseBasedReasoning’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I/usr/local/include -fpic -g -O2 -c distanceAPI.cpp -o distanceAPI.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I/usr/local/include -fpic -g -O2 -c distances.cpp -o distances.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I/usr/local/include -fpic -g -O2 -c order.cpp -o order.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I/usr/local/include -fpic -g -O2 -c weightedKNN.cpp -o weightedKNN.o
-...
-g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o CaseBasedReasoning.so RcppExports.o distanceAPI.o distances.o order.o weightedKNN.o -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/CaseBasedReasoning/new/CaseBasedReasoning.Rcheck/00LOCK-CaseBasedReasoning/00new/CaseBasedReasoning/libs
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘rms’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Execution halted
-ERROR: lazy loading failed for package ‘CaseBasedReasoning’
-* removing ‘/tmp/workdir/CaseBasedReasoning/new/CaseBasedReasoning.Rcheck/CaseBasedReasoning’
-
-
-```
-### CRAN
-
-```
-* installing *source* package ‘CaseBasedReasoning’ ...
-** package ‘CaseBasedReasoning’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I/usr/local/include -fpic -g -O2 -c distanceAPI.cpp -o distanceAPI.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I/usr/local/include -fpic -g -O2 -c distances.cpp -o distances.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I/usr/local/include -fpic -g -O2 -c order.cpp -o order.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I/usr/local/include -fpic -g -O2 -c weightedKNN.cpp -o weightedKNN.o
-...
-g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o CaseBasedReasoning.so RcppExports.o distanceAPI.o distances.o order.o weightedKNN.o -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/CaseBasedReasoning/old/CaseBasedReasoning.Rcheck/00LOCK-CaseBasedReasoning/00new/CaseBasedReasoning/libs
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘rms’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Execution halted
-ERROR: lazy loading failed for package ‘CaseBasedReasoning’
-* removing ‘/tmp/workdir/CaseBasedReasoning/old/CaseBasedReasoning.Rcheck/CaseBasedReasoning’
-
-
-```
-# CGPfunctions
+# CGPfunctions
@@ -1684,7 +1618,7 @@ ERROR: lazy loading failed for package ‘CaseBasedReasoning’
* GitHub: https://github.com/ibecav/CGPfunctions
* Source code: https://github.com/cran/CGPfunctions
* Date/Publication: 2020-11-12 14:50:09 UTC
-* Number of recursive dependencies: 158
+* Number of recursive dependencies: 148
Run `revdepcheck::cloud_details(, "CGPfunctions")` for more info
@@ -1739,6 +1673,158 @@ ERROR: lazy loading failed for package ‘CGPfunctions’
* removing ‘/tmp/workdir/CGPfunctions/old/CGPfunctions.Rcheck/CGPfunctions’
+```
+# chemodiv
+
+
+
+* Version: 0.3.0
+* GitHub: https://github.com/hpetren/chemodiv
+* Source code: https://github.com/cran/chemodiv
+* Date/Publication: 2023-08-17 17:52:33 UTC
+* Number of recursive dependencies: 170
+
+Run `revdepcheck::cloud_details(, "chemodiv")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/chemodiv/new/chemodiv.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘chemodiv/DESCRIPTION’ ... OK
+...
+* this is package ‘chemodiv’ version ‘0.3.0’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'fmcsR', 'ChemmineR'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/chemodiv/old/chemodiv.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘chemodiv/DESCRIPTION’ ... OK
+...
+* this is package ‘chemodiv’ version ‘0.3.0’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'fmcsR', 'ChemmineR'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# chicane
+
+
+
+* Version: 0.1.8
+* GitHub: NA
+* Source code: https://github.com/cran/chicane
+* Date/Publication: 2021-11-06 15:00:16 UTC
+* Number of recursive dependencies: 177
+
+Run `revdepcheck::cloud_details(, "chicane")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/chicane/new/chicane.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘chicane/DESCRIPTION’ ... OK
+...
+* checking tests ... OK
+ Running ‘testthat.R’
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘Getting_Started.Rmd’ using ‘UTF-8’... OK
+ ‘Visualising_Interactions.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 WARNING, 1 NOTE
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/chicane/old/chicane.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘chicane/DESCRIPTION’ ... OK
+...
+* checking tests ... OK
+ Running ‘testthat.R’
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘Getting_Started.Rmd’ using ‘UTF-8’... OK
+ ‘Visualising_Interactions.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 WARNING, 1 NOTE
+
+
+
+
+
```
# chipPCR
@@ -1803,6 +1889,82 @@ ERROR: lazy loading failed for package ‘chipPCR’
* removing ‘/tmp/workdir/chipPCR/old/chipPCR.Rcheck/chipPCR’
+```
+# cinaR
+
+
+
+* Version: 0.2.3
+* GitHub: https://github.com/eonurk/cinaR
+* Source code: https://github.com/cran/cinaR
+* Date/Publication: 2022-05-18 14:00:09 UTC
+* Number of recursive dependencies: 177
+
+Run `revdepcheck::cloud_details(, "cinaR")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/cinaR/new/cinaR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘cinaR/DESCRIPTION’ ... OK
+...
+* checking package dependencies ... ERROR
+Packages required but not available:
+ 'ChIPseeker', 'TxDb.Hsapiens.UCSC.hg38.knownGene',
+ 'TxDb.Hsapiens.UCSC.hg19.knownGene',
+ 'TxDb.Mmusculus.UCSC.mm10.knownGene'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/cinaR/old/cinaR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘cinaR/DESCRIPTION’ ... OK
+...
+* checking package dependencies ... ERROR
+Packages required but not available:
+ 'ChIPseeker', 'TxDb.Hsapiens.UCSC.hg38.knownGene',
+ 'TxDb.Hsapiens.UCSC.hg19.knownGene',
+ 'TxDb.Mmusculus.UCSC.mm10.knownGene'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
```
# cmprskcoxmsm
@@ -1866,49 +2028,125 @@ ERROR: lazy loading failed for package ‘cmprskcoxmsm’
```
-# coarseDataTools
+# CNVScope
-* Version: 0.6-6
-* GitHub: NA
-* Source code: https://github.com/cran/coarseDataTools
-* Date/Publication: 2021-12-09 17:20:05 UTC
-* Number of recursive dependencies: 17
+* Version: 3.7.2
+* GitHub: https://github.com/jamesdalg/CNVScope
+* Source code: https://github.com/cran/CNVScope
+* Date/Publication: 2022-03-30 23:40:08 UTC
+* Number of recursive dependencies: 206
-Run `revdepcheck::cloud_details(, "coarseDataTools")` for more info
+Run `revdepcheck::cloud_details(, "CNVScope")` for more info
-## In both
-
-* checking whether package ‘coarseDataTools’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/coarseDataTools/new/coarseDataTools.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘coarseDataTools’ ...
-** package ‘coarseDataTools’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘coarseDataTools’
-* removing ‘/tmp/workdir/coarseDataTools/new/coarseDataTools.Rcheck/coarseDataTools’
+* using log directory ‘/tmp/workdir/CNVScope/new/CNVScope.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘CNVScope/DESCRIPTION’ ... OK
+...
+Packages required but not available: 'GenomicInteractions', 'rtracklayer'
+Packages suggested but not available for checking:
+ 'ComplexHeatmap', 'HiCseg', 'GenomicFeatures',
+ 'BSgenome.Hsapiens.UCSC.hg19'
-```
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/CNVScope/old/CNVScope.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘CNVScope/DESCRIPTION’ ... OK
+...
+Packages required but not available: 'GenomicInteractions', 'rtracklayer'
+
+Packages suggested but not available for checking:
+ 'ComplexHeatmap', 'HiCseg', 'GenomicFeatures',
+ 'BSgenome.Hsapiens.UCSC.hg19'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# coarseDataTools
+
+
+
+* Version: 0.6-6
+* GitHub: NA
+* Source code: https://github.com/cran/coarseDataTools
+* Date/Publication: 2021-12-09 17:20:05 UTC
+* Number of recursive dependencies: 17
+
+Run `revdepcheck::cloud_details(, "coarseDataTools")` for more info
+
+
+
+## In both
+
+* checking whether package ‘coarseDataTools’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/coarseDataTools/new/coarseDataTools.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘coarseDataTools’ ...
+** package ‘coarseDataTools’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘coarseDataTools’
+* removing ‘/tmp/workdir/coarseDataTools/new/coarseDataTools.Rcheck/coarseDataTools’
+
+
+```
### CRAN
```
@@ -1992,26 +2230,26 @@ ERROR: lazy loading failed for package ‘COMBO’
```
-# ConnectednessApproach
+# COMMA
-* Version: 1.0.3
+* Version: 1.0.0
* GitHub: NA
-* Source code: https://github.com/cran/ConnectednessApproach
-* Date/Publication: 2024-06-16 16:20:02 UTC
-* Number of recursive dependencies: 131
+* Source code: https://github.com/cran/COMMA
+* Date/Publication: 2024-07-21 10:10:05 UTC
+* Number of recursive dependencies: 72
-Run `revdepcheck::cloud_details(, "ConnectednessApproach")` for more info
+Run `revdepcheck::cloud_details(, "COMMA")` for more info
## In both
-* checking whether package ‘ConnectednessApproach’ can be installed ... ERROR
+* checking whether package ‘COMMA’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/ConnectednessApproach/new/ConnectednessApproach.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/COMMA/new/COMMA.Rcheck/00install.out’ for details.
```
## Installation
@@ -2019,61 +2257,59 @@ Run `revdepcheck::cloud_details(, "ConnectednessApproach")` for more info
### Devel
```
-* installing *source* package ‘ConnectednessApproach’ ...
-** package ‘ConnectednessApproach’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘COMMA’ ...
+** package ‘COMMA’ successfully unpacked and MD5 sums checked
** using staged installation
** R
-** data
-*** moving datasets to lazyload DB
+** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘ConnectednessApproach’
-* removing ‘/tmp/workdir/ConnectednessApproach/new/ConnectednessApproach.Rcheck/ConnectednessApproach’
+ERROR: lazy loading failed for package ‘COMMA’
+* removing ‘/tmp/workdir/COMMA/new/COMMA.Rcheck/COMMA’
```
### CRAN
```
-* installing *source* package ‘ConnectednessApproach’ ...
-** package ‘ConnectednessApproach’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘COMMA’ ...
+** package ‘COMMA’ successfully unpacked and MD5 sums checked
** using staged installation
** R
-** data
-*** moving datasets to lazyload DB
+** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘ConnectednessApproach’
-* removing ‘/tmp/workdir/ConnectednessApproach/old/ConnectednessApproach.Rcheck/ConnectednessApproach’
+ERROR: lazy loading failed for package ‘COMMA’
+* removing ‘/tmp/workdir/COMMA/old/COMMA.Rcheck/COMMA’
```
-# contrast
+# ConnectednessApproach
-* Version: 0.24.2
-* GitHub: https://github.com/Alanocallaghan/contrast
-* Source code: https://github.com/cran/contrast
-* Date/Publication: 2022-10-05 17:20:09 UTC
-* Number of recursive dependencies: 111
+* Version: 1.0.3
+* GitHub: NA
+* Source code: https://github.com/cran/ConnectednessApproach
+* Date/Publication: 2024-06-16 16:20:02 UTC
+* Number of recursive dependencies: 131
-Run `revdepcheck::cloud_details(, "contrast")` for more info
+Run `revdepcheck::cloud_details(, "ConnectednessApproach")` for more info
## In both
-* checking whether package ‘contrast’ can be installed ... ERROR
+* checking whether package ‘ConnectednessApproach’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/contrast/new/contrast.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/ConnectednessApproach/new/ConnectednessApproach.Rcheck/00install.out’ for details.
```
## Installation
@@ -2081,40 +2317,114 @@ Run `revdepcheck::cloud_details(, "contrast")` for more info
### Devel
```
-* installing *source* package ‘contrast’ ...
-** package ‘contrast’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘ConnectednessApproach’ ...
+** package ‘ConnectednessApproach’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
*** moving datasets to lazyload DB
-** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘contrast’
-* removing ‘/tmp/workdir/contrast/new/contrast.Rcheck/contrast’
+ERROR: lazy loading failed for package ‘ConnectednessApproach’
+* removing ‘/tmp/workdir/ConnectednessApproach/new/ConnectednessApproach.Rcheck/ConnectednessApproach’
```
### CRAN
```
-* installing *source* package ‘contrast’ ...
-** package ‘contrast’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘ConnectednessApproach’ ...
+** package ‘ConnectednessApproach’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
*** moving datasets to lazyload DB
-** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘contrast’
-* removing ‘/tmp/workdir/contrast/old/contrast.Rcheck/contrast’
+ERROR: lazy loading failed for package ‘ConnectednessApproach’
+* removing ‘/tmp/workdir/ConnectednessApproach/old/ConnectednessApproach.Rcheck/ConnectednessApproach’
+
+
+```
+# conos
+
+
+
+* Version: 1.5.2
+* GitHub: https://github.com/kharchenkolab/conos
+* Source code: https://github.com/cran/conos
+* Date/Publication: 2024-02-26 19:30:05 UTC
+* Number of recursive dependencies: 240
+
+Run `revdepcheck::cloud_details(, "conos")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/conos/new/conos.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘conos/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘ComplexHeatmap’
+
+Package suggested but not available for checking: ‘pagoda2’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/conos/old/conos.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘conos/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘ComplexHeatmap’
+
+Package suggested but not available for checking: ‘pagoda2’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
@@ -2122,59 +2432,75 @@ ERROR: lazy loading failed for package ‘contrast’
-* Version: 0.4-4
+* Version: 0.5-1
* GitHub: NA
* Source code: https://github.com/cran/cotram
-* Date/Publication: 2023-05-25 15:30:02 UTC
-* Number of recursive dependencies: 31
+* Date/Publication: 2024-07-19 10:20:03 UTC
+* Number of recursive dependencies: 32
Run `revdepcheck::cloud_details(, "cotram")` for more info
-## In both
-
-* checking whether package ‘cotram’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/cotram/new/cotram.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘cotram’ ...
-** package ‘cotram’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘mlt’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- there is no package called ‘coneproj’
-Execution halted
-ERROR: lazy loading failed for package ‘cotram’
-* removing ‘/tmp/workdir/cotram/new/cotram.Rcheck/cotram’
+* using log directory ‘/tmp/workdir/cotram/new/cotram.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘cotram/DESCRIPTION’ ... OK
+...
+* this is package ‘cotram’ version ‘0.5-1’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'tram', 'mlt'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘cotram’ ...
-** package ‘cotram’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘mlt’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- there is no package called ‘coneproj’
-Execution halted
-ERROR: lazy loading failed for package ‘cotram’
-* removing ‘/tmp/workdir/cotram/old/cotram.Rcheck/cotram’
+* using log directory ‘/tmp/workdir/cotram/old/cotram.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘cotram/DESCRIPTION’ ... OK
+...
+* this is package ‘cotram’ version ‘0.5-1’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'tram', 'mlt'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
@@ -2256,65 +2582,79 @@ ERROR: lazy loading failed for package ‘countSTAR’
```
-# coxed
+# crosstalkr
-* Version: 0.3.3
-* GitHub: https://github.com/jkropko/coxed
-* Source code: https://github.com/cran/coxed
-* Date/Publication: 2020-08-02 01:20:07 UTC
-* Number of recursive dependencies: 95
+* Version: 1.0.5
+* GitHub: NA
+* Source code: https://github.com/cran/crosstalkr
+* Date/Publication: 2024-05-17 11:40:09 UTC
+* Number of recursive dependencies: 164
-Run `revdepcheck::cloud_details(, "coxed")` for more info
+Run `revdepcheck::cloud_details(, "crosstalkr")` for more info
-## In both
-
-* checking whether package ‘coxed’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/coxed/new/coxed.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘coxed’ ...
-** package ‘coxed’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘rms’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Execution halted
-ERROR: lazy loading failed for package ‘coxed’
-* removing ‘/tmp/workdir/coxed/new/coxed.Rcheck/coxed’
+* using log directory ‘/tmp/workdir/crosstalkr/new/crosstalkr.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘crosstalkr/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘ensembldb’
+
+Package suggested but not available for checking: ‘EnsDb.Hsapiens.v86’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘coxed’ ...
-** package ‘coxed’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘rms’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Execution halted
-ERROR: lazy loading failed for package ‘coxed’
-* removing ‘/tmp/workdir/coxed/old/coxed.Rcheck/coxed’
+* using log directory ‘/tmp/workdir/crosstalkr/old/crosstalkr.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘crosstalkr/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘ensembldb’
+
+Package suggested but not available for checking: ‘EnsDb.Hsapiens.v86’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
@@ -2352,8 +2692,8 @@ Run `revdepcheck::cloud_details(, "CSCNet")` for more info
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+ there is no package called ‘rms’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
ERROR: lazy loading failed for package ‘CSCNet’
* removing ‘/tmp/workdir/CSCNet/new/CSCNet.Rcheck/CSCNet’
@@ -2370,86 +2710,22 @@ ERROR: lazy loading failed for package ‘CSCNet’
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+ there is no package called ‘rms’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
ERROR: lazy loading failed for package ‘CSCNet’
* removing ‘/tmp/workdir/CSCNet/old/CSCNet.Rcheck/CSCNet’
-```
-# csmpv
-
-
-
-* Version: 1.0.3
-* GitHub: NA
-* Source code: https://github.com/cran/csmpv
-* Date/Publication: 2024-03-01 18:12:44 UTC
-* Number of recursive dependencies: 178
-
-Run `revdepcheck::cloud_details(, "csmpv")` for more info
-
-
-
-## In both
-
-* checking whether package ‘csmpv’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/csmpv/new/csmpv.Rcheck/00install.out’ for details.
- ```
-
-## Installation
-
-### Devel
-
-```
-* installing *source* package ‘csmpv’ ...
-** package ‘csmpv’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘csmpv’
-* removing ‘/tmp/workdir/csmpv/new/csmpv.Rcheck/csmpv’
-
-
-```
-### CRAN
-
-```
-* installing *source* package ‘csmpv’ ...
-** package ‘csmpv’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘csmpv’
-* removing ‘/tmp/workdir/csmpv/old/csmpv.Rcheck/csmpv’
-
-
```
# ctsem
-* Version: 3.10.0
+* Version: 3.10.1
* GitHub: https://github.com/cdriveraus/ctsem
* Source code: https://github.com/cran/ctsem
-* Date/Publication: 2024-05-09 14:40:03 UTC
+* Date/Publication: 2024-08-19 14:40:06 UTC
* Number of recursive dependencies: 158
Run `revdepcheck::cloud_details(, "ctsem")` for more info
@@ -2519,68 +2795,6 @@ ERROR: compilation failed for package ‘ctsem’
* removing ‘/tmp/workdir/ctsem/old/ctsem.Rcheck/ctsem’
-```
-# cwbtools
-
-
-
-* Version: 0.4.2
-* GitHub: https://github.com/PolMine/cwbtools
-* Source code: https://github.com/cran/cwbtools
-* Date/Publication: 2024-04-28 22:20:06 UTC
-* Number of recursive dependencies: 108
-
-Run `revdepcheck::cloud_details(, "cwbtools")` for more info
-
-
-
-## In both
-
-* checking whether package ‘cwbtools’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/cwbtools/new/cwbtools.Rcheck/00install.out’ for details.
- ```
-
-## Installation
-
-### Devel
-
-```
-* installing *source* package ‘cwbtools’ ...
-** package ‘cwbtools’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in dyn.load(file, DLLpath = DLLpath, ...) :
- unable to load shared object '/opt/R/4.3.1/lib/R/site-library/redland/libs/redland.so':
- librdf.so.0: cannot open shared object file: No such file or directory
-Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load
-Execution halted
-ERROR: lazy loading failed for package ‘cwbtools’
-* removing ‘/tmp/workdir/cwbtools/new/cwbtools.Rcheck/cwbtools’
-
-
-```
-### CRAN
-
-```
-* installing *source* package ‘cwbtools’ ...
-** package ‘cwbtools’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in dyn.load(file, DLLpath = DLLpath, ...) :
- unable to load shared object '/opt/R/4.3.1/lib/R/site-library/redland/libs/redland.so':
- librdf.so.0: cannot open shared object file: No such file or directory
-Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load
-Execution halted
-ERROR: lazy loading failed for package ‘cwbtools’
-* removing ‘/tmp/workdir/cwbtools/old/cwbtools.Rcheck/cwbtools’
-
-
```
# dataone
@@ -2714,55 +2928,71 @@ ERROR: lazy loading failed for package ‘datapack’
* GitHub: NA
* Source code: https://github.com/cran/deeptrafo
* Date/Publication: 2022-11-22 09:50:02 UTC
-* Number of recursive dependencies: 95
+* Number of recursive dependencies: 96
Run `revdepcheck::cloud_details(, "deeptrafo")` for more info
-## In both
-
-* checking whether package ‘deeptrafo’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/deeptrafo/new/deeptrafo.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘deeptrafo’ ...
-** package ‘deeptrafo’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- there is no package called ‘coneproj’
-Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
-Execution halted
-ERROR: lazy loading failed for package ‘deeptrafo’
-* removing ‘/tmp/workdir/deeptrafo/new/deeptrafo.Rcheck/deeptrafo’
+* using log directory ‘/tmp/workdir/deeptrafo/new/deeptrafo.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘deeptrafo/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘mlt’
+
+Packages suggested but not available for checking: 'tram', 'cotram'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘deeptrafo’ ...
-** package ‘deeptrafo’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- there is no package called ‘coneproj’
-Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
-Execution halted
-ERROR: lazy loading failed for package ‘deeptrafo’
-* removing ‘/tmp/workdir/deeptrafo/old/deeptrafo.Rcheck/deeptrafo’
+* using log directory ‘/tmp/workdir/deeptrafo/old/deeptrafo.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘deeptrafo/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘mlt’
+
+Packages suggested but not available for checking: 'tram', 'cotram'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
@@ -2839,6 +3069,62 @@ ERROR: lazy loading failed for package ‘diveMove’
* removing ‘/tmp/workdir/diveMove/old/diveMove.Rcheck/diveMove’
+```
+# do
+
+
+
+* Version: 2.0.0.0
+* GitHub: https://github.com/yikeshu0611/do
+* Source code: https://github.com/cran/do
+* Date/Publication: 2021-08-03 11:40:02 UTC
+* Number of recursive dependencies: 70
+
+Run `revdepcheck::cloud_details(, "do")` for more info
+
+
+
+## In both
+
+* checking whether package ‘do’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/do/new/do.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘do’ ...
+** package ‘do’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Error: object ‘.__T__[:base’ is not exported by 'namespace:data.table'
+Execution halted
+ERROR: lazy loading failed for package ‘do’
+* removing ‘/tmp/workdir/do/new/do.Rcheck/do’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘do’ ...
+** package ‘do’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Error: object ‘.__T__[:base’ is not exported by 'namespace:data.table'
+Execution halted
+ERROR: lazy loading failed for package ‘do’
+* removing ‘/tmp/workdir/do/old/do.Rcheck/do’
+
+
```
# DR.SC
@@ -2917,6 +3203,82 @@ ERROR: lazy loading failed for package ‘DR.SC’
* removing ‘/tmp/workdir/DR.SC/old/DR.SC.Rcheck/DR.SC’
+```
+# driveR
+
+
+
+* Version: 0.4.1
+* GitHub: https://github.com/egeulgen/driveR
+* Source code: https://github.com/cran/driveR
+* Date/Publication: 2023-08-19 14:02:36 UTC
+* Number of recursive dependencies: 166
+
+Run `revdepcheck::cloud_details(, "driveR")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/driveR/new/driveR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘driveR/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available:
+ 'GenomicFeatures', 'TxDb.Hsapiens.UCSC.hg19.knownGene',
+ 'TxDb.Hsapiens.UCSC.hg38.knownGene'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/driveR/old/driveR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘driveR/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available:
+ 'GenomicFeatures', 'TxDb.Hsapiens.UCSC.hg19.knownGene',
+ 'TxDb.Hsapiens.UCSC.hg38.knownGene'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
```
# drtmle
@@ -2978,86 +3340,178 @@ ERROR: lazy loading failed for package ‘drtmle’
```
-# ecolottery
+# DrugSim2DR
-* Version: 1.0.0
-* GitHub: https://github.com/frmunoz/ecolottery
-* Source code: https://github.com/cran/ecolottery
-* Date/Publication: 2017-07-03 11:01:29 UTC
-* Number of recursive dependencies: 88
+* Version: 0.1.1
+* GitHub: NA
+* Source code: https://github.com/cran/DrugSim2DR
+* Date/Publication: 2023-08-10 04:50:02 UTC
+* Number of recursive dependencies: 89
-Run `revdepcheck::cloud_details(, "ecolottery")` for more info
+Run `revdepcheck::cloud_details(, "DrugSim2DR")` for more info
-## In both
+## Error before installation
-* checking whether package ‘ecolottery’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/00install.out’ for details.
- ```
+### Devel
-## Installation
+```
+* using log directory ‘/tmp/workdir/DrugSim2DR/new/DrugSim2DR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘DrugSim2DR/DESCRIPTION’ ... OK
+...
+* this is package ‘DrugSim2DR’ version ‘0.1.1’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘ChemmineR’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/DrugSim2DR/old/DrugSim2DR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘DrugSim2DR/DESCRIPTION’ ... OK
+...
+* this is package ‘DrugSim2DR’ version ‘0.1.1’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘ChemmineR’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# DRviaSPCN
+
+
+
+* Version: 0.1.4
+* GitHub: NA
+* Source code: https://github.com/cran/DRviaSPCN
+* Date/Publication: 2024-01-13 05:00:02 UTC
+* Number of recursive dependencies: 180
+
+Run `revdepcheck::cloud_details(, "DRviaSPCN")` for more info
+
+
+
+## Error before installation
### Devel
```
-* installing *source* package ‘ecolottery’ ...
-** package ‘ecolottery’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘ecolottery’
-* removing ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/ecolottery’
+* using log directory ‘/tmp/workdir/DRviaSPCN/new/DRviaSPCN.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘DRviaSPCN/DESCRIPTION’ ... OK
+...
+* this is package ‘DRviaSPCN’ version ‘0.1.4’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘ChemmineR’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘ecolottery’ ...
-** package ‘ecolottery’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘ecolottery’
-* removing ‘/tmp/workdir/ecolottery/old/ecolottery.Rcheck/ecolottery’
+* using log directory ‘/tmp/workdir/DRviaSPCN/old/DRviaSPCN.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘DRviaSPCN/DESCRIPTION’ ... OK
+...
+* this is package ‘DRviaSPCN’ version ‘0.1.4’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘ChemmineR’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
-# EdSurvey
+# ech
-* Version: 4.0.7
-* GitHub: https://github.com/American-Institutes-for-Research/EdSurvey
-* Source code: https://github.com/cran/EdSurvey
-* Date/Publication: 2024-06-27 14:50:14 UTC
-* Number of recursive dependencies: 128
+* Version: 0.1.3
+* GitHub: NA
+* Source code: https://github.com/cran/ech
+* Date/Publication: 2023-05-11 08:50:17 UTC
+* Number of recursive dependencies: 126
-Run `revdepcheck::cloud_details(, "EdSurvey")` for more info
+Run `revdepcheck::cloud_details(, "ech")` for more info
## In both
-* checking whether package ‘EdSurvey’ can be installed ... ERROR
+* checking whether package ‘ech’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/EdSurvey/new/EdSurvey.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/ech/new/ech.Rcheck/00install.out’ for details.
```
## Installation
@@ -3065,69 +3519,63 @@ Run `revdepcheck::cloud_details(, "EdSurvey")` for more info
### Devel
```
-* installing *source* package ‘EdSurvey’ ...
-** package ‘EdSurvey’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘ech’ ...
+** package ‘ech’ successfully unpacked and MD5 sums checked
** using staged installation
** R
+** data
+*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Warning in check_dep_version() :
- ABI version mismatch:
-lme4 was built with Matrix ABI version 1
-Current Matrix ABI version is 0
-Please re-install lme4 from source or restore original ‘Matrix’ package
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+ there is no package called ‘rjson’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
-ERROR: lazy loading failed for package ‘EdSurvey’
-* removing ‘/tmp/workdir/EdSurvey/new/EdSurvey.Rcheck/EdSurvey’
+ERROR: lazy loading failed for package ‘ech’
+* removing ‘/tmp/workdir/ech/new/ech.Rcheck/ech’
```
### CRAN
```
-* installing *source* package ‘EdSurvey’ ...
-** package ‘EdSurvey’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘ech’ ...
+** package ‘ech’ successfully unpacked and MD5 sums checked
** using staged installation
** R
+** data
+*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Warning in check_dep_version() :
- ABI version mismatch:
-lme4 was built with Matrix ABI version 1
-Current Matrix ABI version is 0
-Please re-install lme4 from source or restore original ‘Matrix’ package
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+ there is no package called ‘rjson’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
-ERROR: lazy loading failed for package ‘EdSurvey’
-* removing ‘/tmp/workdir/EdSurvey/old/EdSurvey.Rcheck/EdSurvey’
+ERROR: lazy loading failed for package ‘ech’
+* removing ‘/tmp/workdir/ech/old/ech.Rcheck/ech’
```
-# EpiEstim
+# EcoEnsemble
-* Version: 2.2-4
-* GitHub: https://github.com/mrc-ide/EpiEstim
-* Source code: https://github.com/cran/EpiEstim
-* Date/Publication: 2021-01-07 16:20:10 UTC
+* Version: 1.1.0
+* GitHub: https://github.com/CefasRepRes/EcoEnsemble
+* Source code: https://github.com/cran/EcoEnsemble
+* Date/Publication: 2024-08-19 17:20:06 UTC
* Number of recursive dependencies: 91
-Run `revdepcheck::cloud_details(, "EpiEstim")` for more info
+Run `revdepcheck::cloud_details(, "EcoEnsemble")` for more info
## In both
-* checking whether package ‘EpiEstim’ can be installed ... ERROR
+* checking whether package ‘EcoEnsemble’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/EpiEstim/new/EpiEstim.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/00install.out’ for details.
```
## Installation
@@ -3135,13 +3583,221 @@ Run `revdepcheck::cloud_details(, "EpiEstim")` for more info
### Devel
```
-* installing *source* package ‘EpiEstim’ ...
-** package ‘EpiEstim’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘EcoEnsemble’ ...
+** package ‘EcoEnsemble’ successfully unpacked and MD5 sums checked
** using staged installation
-** R
-** data
-** inst
-** byte-compile and prepare package for lazy loading
+** libs
+using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
+using C++17
+
+
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o
+In file included from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205,
+...
+/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ensemble_model_hierarchical_withdrivers_namespace::model_ensemble_model_hierarchical_withdrivers; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’
+/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here
+/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes]
+ 654 | return internal::first_aligned::alignment),Derived>(m);
+ | ^~~~~~~~~
+g++: fatal error: Killed signal terminated program cc1plus
+compilation terminated.
+make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ensemble_model_hierarchical_withdrivers.o] Error 1
+ERROR: compilation failed for package ‘EcoEnsemble’
+* removing ‘/tmp/workdir/EcoEnsemble/new/EcoEnsemble.Rcheck/EcoEnsemble’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘EcoEnsemble’ ...
+** package ‘EcoEnsemble’ successfully unpacked and MD5 sums checked
+** using staged installation
+** libs
+using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
+using C++17
+
+
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c KF_back.cpp -o KF_back.o
+In file included from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205,
+...
+/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_ensemble_model_hierarchical_withdrivers_namespace::model_ensemble_model_hierarchical_withdrivers; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’
+/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here
+/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes]
+ 654 | return internal::first_aligned::alignment),Derived>(m);
+ | ^~~~~~~~~
+g++: fatal error: Killed signal terminated program cc1plus
+compilation terminated.
+make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_ensemble_model_hierarchical_withdrivers.o] Error 1
+ERROR: compilation failed for package ‘EcoEnsemble’
+* removing ‘/tmp/workdir/EcoEnsemble/old/EcoEnsemble.Rcheck/EcoEnsemble’
+
+
+```
+# ecolottery
+
+
+
+* Version: 1.0.0
+* GitHub: https://github.com/frmunoz/ecolottery
+* Source code: https://github.com/cran/ecolottery
+* Date/Publication: 2017-07-03 11:01:29 UTC
+* Number of recursive dependencies: 88
+
+Run `revdepcheck::cloud_details(, "ecolottery")` for more info
+
+
+
+## In both
+
+* checking whether package ‘ecolottery’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘ecolottery’ ...
+** package ‘ecolottery’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘ecolottery’
+* removing ‘/tmp/workdir/ecolottery/new/ecolottery.Rcheck/ecolottery’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘ecolottery’ ...
+** package ‘ecolottery’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘ecolottery’
+* removing ‘/tmp/workdir/ecolottery/old/ecolottery.Rcheck/ecolottery’
+
+
+```
+# EdSurvey
+
+
+
+* Version: 4.0.7
+* GitHub: https://github.com/American-Institutes-for-Research/EdSurvey
+* Source code: https://github.com/cran/EdSurvey
+* Date/Publication: 2024-06-27 14:50:14 UTC
+* Number of recursive dependencies: 128
+
+Run `revdepcheck::cloud_details(, "EdSurvey")` for more info
+
+
+
+## In both
+
+* checking whether package ‘EdSurvey’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/EdSurvey/new/EdSurvey.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘EdSurvey’ ...
+** package ‘EdSurvey’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Warning in check_dep_version() :
+ ABI version mismatch:
+lme4 was built with Matrix ABI version 1
+Current Matrix ABI version is 0
+Please re-install lme4 from source or restore original ‘Matrix’ package
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘EdSurvey’
+* removing ‘/tmp/workdir/EdSurvey/new/EdSurvey.Rcheck/EdSurvey’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘EdSurvey’ ...
+** package ‘EdSurvey’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Warning in check_dep_version() :
+ ABI version mismatch:
+lme4 was built with Matrix ABI version 1
+Current Matrix ABI version is 0
+Please re-install lme4 from source or restore original ‘Matrix’ package
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘EdSurvey’
+* removing ‘/tmp/workdir/EdSurvey/old/EdSurvey.Rcheck/EdSurvey’
+
+
+```
+# EpiEstim
+
+
+
+* Version: 2.2-4
+* GitHub: https://github.com/mrc-ide/EpiEstim
+* Source code: https://github.com/cran/EpiEstim
+* Date/Publication: 2021-01-07 16:20:10 UTC
+* Number of recursive dependencies: 91
+
+Run `revdepcheck::cloud_details(, "EpiEstim")` for more info
+
+
+
+## In both
+
+* checking whether package ‘EpiEstim’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/EpiEstim/new/EpiEstim.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘EpiEstim’ ...
+** package ‘EpiEstim’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+** inst
+** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
@@ -3344,68 +4000,6 @@ ERROR: lazy loading failed for package ‘FAIRmaterials’
* removing ‘/tmp/workdir/FAIRmaterials/old/FAIRmaterials.Rcheck/FAIRmaterials’
-```
-# FoReco
-
-
-
-* Version: 0.2.6
-* GitHub: https://github.com/daniGiro/FoReco
-* Source code: https://github.com/cran/FoReco
-* Date/Publication: 2023-05-16 08:40:10 UTC
-* Number of recursive dependencies: 32
-
-Run `revdepcheck::cloud_details(, "FoReco")` for more info
-
-
-
-## In both
-
-* checking whether package ‘FoReco’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/FoReco/new/FoReco.Rcheck/00install.out’ for details.
- ```
-
-## Installation
-
-### Devel
-
-```
-* installing *source* package ‘FoReco’ ...
-** package ‘FoReco’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘osqp’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required
-Execution halted
-ERROR: lazy loading failed for package ‘FoReco’
-* removing ‘/tmp/workdir/FoReco/new/FoReco.Rcheck/FoReco’
-
-
-```
-### CRAN
-
-```
-* installing *source* package ‘FoReco’ ...
-** package ‘FoReco’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘osqp’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1 is required
-Execution halted
-ERROR: lazy loading failed for package ‘FoReco’
-* removing ‘/tmp/workdir/FoReco/old/FoReco.Rcheck/FoReco’
-
-
```
# FREEtree
@@ -3481,88 +4075,93 @@ ERROR: lazy loading failed for package ‘FREEtree’
```
-# GeneNMF
+# GALLO
-* Version: 0.4.0
-* GitHub: https://github.com/carmonalab/GeneNMF
-* Source code: https://github.com/cran/GeneNMF
-* Date/Publication: 2024-02-29 12:22:40 UTC
-* Number of recursive dependencies: 169
+* Version: 1.5
+* GitHub: NA
+* Source code: https://github.com/cran/GALLO
+* Date/Publication: 2024-06-04 15:30:20 UTC
+* Number of recursive dependencies: 142
-Run `revdepcheck::cloud_details(, "GeneNMF")` for more info
+Run `revdepcheck::cloud_details(, "GALLO")` for more info
-## In both
-
-* checking whether package ‘GeneNMF’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/GeneNMF/new/GeneNMF.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘GeneNMF’ ...
-** package ‘GeneNMF’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-Warning: namespace ‘Seurat’ is not available and has been replaced
-by .GlobalEnv when processing object ‘sampleObj’
-Warning: namespace ‘Seurat’ is not available and has been replaced
-by .GlobalEnv when processing object ‘sampleObj’
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘GeneNMF’
-* removing ‘/tmp/workdir/GeneNMF/new/GeneNMF.Rcheck/GeneNMF’
+* using log directory ‘/tmp/workdir/GALLO/new/GALLO.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘GALLO/DESCRIPTION’ ... OK
+...
+* this is package ‘GALLO’ version ‘1.5’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘rtracklayer’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘GeneNMF’ ...
-** package ‘GeneNMF’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-Warning: namespace ‘Seurat’ is not available and has been replaced
-by .GlobalEnv when processing object ‘sampleObj’
-Warning: namespace ‘Seurat’ is not available and has been replaced
-by .GlobalEnv when processing object ‘sampleObj’
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘GeneNMF’
-* removing ‘/tmp/workdir/GeneNMF/old/GeneNMF.Rcheck/GeneNMF’
+* using log directory ‘/tmp/workdir/GALLO/old/GALLO.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘GALLO/DESCRIPTION’ ... OK
+...
+* this is package ‘GALLO’ version ‘1.5’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘rtracklayer’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
-# geomorph
+# gap
-* Version: NA
-* GitHub: NA
-* Source code: https://github.com/cran/geomorph
-* Number of recursive dependencies: 72
+* Version: 1.6
+* GitHub: https://github.com/jinghuazhao/R
+* Source code: https://github.com/cran/gap
+* Date/Publication: 2024-08-27 04:40:06 UTC
+* Number of recursive dependencies: 199
-Run `revdepcheck::cloud_details(, "geomorph")` for more info
+Run `revdepcheck::cloud_details(, "gap")` for more info
@@ -3571,7 +4170,27 @@ Run `revdepcheck::cloud_details(, "geomorph")` for more info
### Devel
```
+* using log directory ‘/tmp/workdir/gap/new/gap.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘gap/DESCRIPTION’ ... OK
+...
+--- failed re-building ‘jss.Rnw’
+
+SUMMARY: processing the following file failed:
+ ‘jss.Rnw’
+
+Error: Vignette re-building failed.
+Execution halted
+* DONE
+Status: 4 NOTEs
@@ -3581,111 +4200,129 @@ Run `revdepcheck::cloud_details(, "geomorph")` for more info
### CRAN
```
+* using log directory ‘/tmp/workdir/gap/old/gap.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘gap/DESCRIPTION’ ... OK
+...
+--- failed re-building ‘jss.Rnw’
+SUMMARY: processing the following file failed:
+ ‘jss.Rnw’
+
+Error: Vignette re-building failed.
+Execution halted
+
+* DONE
+Status: 4 NOTEs
```
-# gfilmm
+# geneHapR
-* Version: 2.0.5
-* GitHub: https://github.com/stla/gfilmm
-* Source code: https://github.com/cran/gfilmm
-* Date/Publication: 2022-07-11 23:20:06 UTC
-* Number of recursive dependencies: 139
+* Version: 1.2.4
+* GitHub: NA
+* Source code: https://github.com/cran/geneHapR
+* Date/Publication: 2024-03-01 14:32:40 UTC
+* Number of recursive dependencies: 180
-Run `revdepcheck::cloud_details(, "gfilmm")` for more info
+Run `revdepcheck::cloud_details(, "geneHapR")` for more info
-## In both
-
-* checking whether package ‘gfilmm’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/gfilmm/new/gfilmm.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘gfilmm’ ...
-** package ‘gfilmm’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using C++11
-g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-In file included from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205,
- from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Dense:1,
- from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/RcppEigenForward.h:28,
+* using log directory ‘/tmp/workdir/geneHapR/new/geneHapR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘geneHapR/DESCRIPTION’ ... OK
...
-installing to /tmp/workdir/gfilmm/new/gfilmm.Rcheck/00LOCK-gfilmm/00new/gfilmm/libs
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error: object ‘ewcdf’ is not exported by 'namespace:spatstat.geom'
-Execution halted
-ERROR: lazy loading failed for package ‘gfilmm’
-* removing ‘/tmp/workdir/gfilmm/new/gfilmm.Rcheck/gfilmm’
+* this is package ‘geneHapR’ version ‘1.2.4’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘rtracklayer’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘gfilmm’ ...
-** package ‘gfilmm’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using C++11
-g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-In file included from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205,
- from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Dense:1,
- from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/RcppEigenForward.h:28,
+* using log directory ‘/tmp/workdir/geneHapR/old/geneHapR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘geneHapR/DESCRIPTION’ ... OK
...
-installing to /tmp/workdir/gfilmm/old/gfilmm.Rcheck/00LOCK-gfilmm/00new/gfilmm/libs
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error: object ‘ewcdf’ is not exported by 'namespace:spatstat.geom'
-Execution halted
-ERROR: lazy loading failed for package ‘gfilmm’
-* removing ‘/tmp/workdir/gfilmm/old/gfilmm.Rcheck/gfilmm’
+* this is package ‘geneHapR’ version ‘1.2.4’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘rtracklayer’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
-# gfilogisreg
+# GeneNMF
-* Version: 1.0.3
-* GitHub: NA
-* Source code: https://github.com/cran/gfilogisreg
-* Date/Publication: 2024-01-25 17:00:06 UTC
-* Number of recursive dependencies: 54
+* Version: 0.6.0
+* GitHub: https://github.com/carmonalab/GeneNMF
+* Source code: https://github.com/cran/GeneNMF
+* Date/Publication: 2024-07-22 08:30:02 UTC
+* Number of recursive dependencies: 161
-Run `revdepcheck::cloud_details(, "gfilogisreg")` for more info
+Run `revdepcheck::cloud_details(, "GeneNMF")` for more info
## In both
-* checking whether package ‘gfilogisreg’ can be installed ... ERROR
+* checking whether package ‘GeneNMF’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/gfilogisreg/new/gfilogisreg.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/GeneNMF/new/GeneNMF.Rcheck/00install.out’ for details.
```
## Installation
@@ -3693,110 +4330,159 @@ Run `revdepcheck::cloud_details(, "gfilogisreg")` for more info
### Devel
```
-* installing *source* package ‘gfilogisreg’ ...
-** package ‘gfilogisreg’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘GeneNMF’ ...
+** package ‘GeneNMF’ successfully unpacked and MD5 sums checked
** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using C++17
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/roptim/include' -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/roptim/include' -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gfilogisreg.cpp -o gfilogisreg.o
-g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o gfilogisreg.so RcppExports.o gfilogisreg.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -lgmp -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/gfilogisreg/new/gfilogisreg.Rcheck/00LOCK-gfilogisreg/00new/gfilogisreg/libs
** R
+** data
+*** moving datasets to lazyload DB
+Warning: namespace ‘Seurat’ is not available and has been replaced
+by .GlobalEnv when processing object ‘sampleObj’
+Warning: namespace ‘Seurat’ is not available and has been replaced
+by .GlobalEnv when processing object ‘sampleObj’
** inst
** byte-compile and prepare package for lazy loading
-Error: object ‘ewcdf’ is not exported by 'namespace:spatstat.geom'
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘gfilogisreg’
-* removing ‘/tmp/workdir/gfilogisreg/new/gfilogisreg.Rcheck/gfilogisreg’
+ERROR: lazy loading failed for package ‘GeneNMF’
+* removing ‘/tmp/workdir/GeneNMF/new/GeneNMF.Rcheck/GeneNMF’
```
### CRAN
```
-* installing *source* package ‘gfilogisreg’ ...
-** package ‘gfilogisreg’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘GeneNMF’ ...
+** package ‘GeneNMF’ successfully unpacked and MD5 sums checked
** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using C++17
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/roptim/include' -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I'/opt/R/4.3.1/lib/R/site-library/roptim/include' -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c gfilogisreg.cpp -o gfilogisreg.o
-g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o gfilogisreg.so RcppExports.o gfilogisreg.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -lgmp -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/gfilogisreg/old/gfilogisreg.Rcheck/00LOCK-gfilogisreg/00new/gfilogisreg/libs
** R
+** data
+*** moving datasets to lazyload DB
+Warning: namespace ‘Seurat’ is not available and has been replaced
+by .GlobalEnv when processing object ‘sampleObj’
+Warning: namespace ‘Seurat’ is not available and has been replaced
+by .GlobalEnv when processing object ‘sampleObj’
** inst
** byte-compile and prepare package for lazy loading
-Error: object ‘ewcdf’ is not exported by 'namespace:spatstat.geom'
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘gfilogisreg’
-* removing ‘/tmp/workdir/gfilogisreg/old/gfilogisreg.Rcheck/gfilogisreg’
+ERROR: lazy loading failed for package ‘GeneNMF’
+* removing ‘/tmp/workdir/GeneNMF/old/GeneNMF.Rcheck/GeneNMF’
```
-# ggrcs
+# GeneSelectR
-* Version: 0.4.0
-* GitHub: NA
-* Source code: https://github.com/cran/ggrcs
-* Date/Publication: 2024-06-29 02:40:02 UTC
-* Number of recursive dependencies: 78
+* Version: 1.0.1
+* GitHub: https://github.com/dzhakparov/GeneSelectR
+* Source code: https://github.com/cran/GeneSelectR
+* Date/Publication: 2024-02-03 14:00:05 UTC
+* Number of recursive dependencies: 191
-Run `revdepcheck::cloud_details(, "ggrcs")` for more info
+Run `revdepcheck::cloud_details(, "GeneSelectR")` for more info
-## In both
-
-* checking whether package ‘ggrcs’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/ggrcs/new/ggrcs.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘ggrcs’ ...
-** package ‘ggrcs’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘ggrcs’
-* removing ‘/tmp/workdir/ggrcs/new/ggrcs.Rcheck/ggrcs’
+* using log directory ‘/tmp/workdir/GeneSelectR/new/GeneSelectR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘GeneSelectR/DESCRIPTION’ ... OK
+...
++ build_vignettes = FALSE)
+
+ When sourcing ‘example.R’:
+Error: there is no package called ‘devtools’
+Execution halted
+
+ ‘example.Rmd’ using ‘UTF-8’... failed
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 WARNING, 1 NOTE
+
+
+
```
### CRAN
```
-* installing *source* package ‘ggrcs’ ...
-** package ‘ggrcs’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+* using log directory ‘/tmp/workdir/GeneSelectR/old/GeneSelectR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘GeneSelectR/DESCRIPTION’ ... OK
+...
++ build_vignettes = FALSE)
+
+ When sourcing ‘example.R’:
+Error: there is no package called ‘devtools’
Execution halted
-ERROR: lazy loading failed for package ‘ggrcs’
-* removing ‘/tmp/workdir/ggrcs/old/ggrcs.Rcheck/ggrcs’
+
+ ‘example.Rmd’ using ‘UTF-8’... failed
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 WARNING, 1 NOTE
+
+
+
+
+
+```
+# geomorph
+
+
+
+* Version: NA
+* GitHub: NA
+* Source code: https://github.com/cran/geomorph
+* Number of recursive dependencies: 72
+
+Run `revdepcheck::cloud_details(, "geomorph")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+
+
+
+
+
+
+```
+### CRAN
+
+```
+
+
+
+
```
@@ -4054,66 +4740,6 @@ ERROR: compilation failed for package ‘gpuR’
* removing ‘/tmp/workdir/gpuR/old/gpuR.Rcheck/gpuR’
-```
-# Greg
-
-
-
-* Version: 2.0.2
-* GitHub: https://github.com/gforge/Greg
-* Source code: https://github.com/cran/Greg
-* Date/Publication: 2024-01-29 13:30:21 UTC
-* Number of recursive dependencies: 151
-
-Run `revdepcheck::cloud_details(, "Greg")` for more info
-
-
-
-## In both
-
-* checking whether package ‘Greg’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/Greg/new/Greg.Rcheck/00install.out’ for details.
- ```
-
-## Installation
-
-### Devel
-
-```
-* installing *source* package ‘Greg’ ...
-** package ‘Greg’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘Greg’
-* removing ‘/tmp/workdir/Greg/new/Greg.Rcheck/Greg’
-
-
-```
-### CRAN
-
-```
-* installing *source* package ‘Greg’ ...
-** package ‘Greg’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘Greg’
-* removing ‘/tmp/workdir/Greg/old/Greg.Rcheck/Greg’
-
-
```
# hettx
@@ -4179,88 +4805,102 @@ ERROR: lazy loading failed for package ‘hettx’
```
-# hIRT
+# Hmisc
-* Version: 0.3.0
-* GitHub: https://github.com/xiangzhou09/hIRT
-* Source code: https://github.com/cran/hIRT
-* Date/Publication: 2020-03-26 17:10:02 UTC
-* Number of recursive dependencies: 88
+* Version: 5.1-3
+* GitHub: NA
+* Source code: https://github.com/cran/Hmisc
+* Date/Publication: 2024-05-28 07:10:02 UTC
+* Number of recursive dependencies: 170
-Run `revdepcheck::cloud_details(, "hIRT")` for more info
+Run `revdepcheck::cloud_details(, "Hmisc")` for more info
-## In both
-
-* checking whether package ‘hIRT’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/hIRT/new/hIRT.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘hIRT’ ...
-** package ‘hIRT’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘hIRT’
-* removing ‘/tmp/workdir/hIRT/new/hIRT.Rcheck/hIRT’
+* using log directory ‘/tmp/workdir/Hmisc/new/Hmisc.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘Hmisc/DESCRIPTION’ ... OK
+...
+* checking for missing documentation entries ... OK
+* checking for code/documentation mismatches ... OK
+* checking Rd \usage sections ... OK
+* checking Rd contents ... OK
+* checking for unstated dependencies in examples ... OK
+* checking line endings in C/C++/Fortran sources/headers ... OK
+* checking compiled code ... OK
+* checking examples ... OK
+* DONE
+Status: 4 NOTEs
+
+
+
```
### CRAN
```
-* installing *source* package ‘hIRT’ ...
-** package ‘hIRT’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘hIRT’
-* removing ‘/tmp/workdir/hIRT/old/hIRT.Rcheck/hIRT’
+* using log directory ‘/tmp/workdir/Hmisc/old/Hmisc.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘Hmisc/DESCRIPTION’ ... OK
+...
+* checking for missing documentation entries ... OK
+* checking for code/documentation mismatches ... OK
+* checking Rd \usage sections ... OK
+* checking Rd contents ... OK
+* checking for unstated dependencies in examples ... OK
+* checking line endings in C/C++/Fortran sources/headers ... OK
+* checking compiled code ... OK
+* checking examples ... OK
+* DONE
+Status: 4 NOTEs
+
+
+
```
-# interactionRCS
+# iClusterVB
-* Version: 0.1.1
-* GitHub: NA
-* Source code: https://github.com/cran/interactionRCS
-* Date/Publication: 2023-11-21 22:40:02 UTC
-* Number of recursive dependencies: 91
+* Version: 0.1.2
+* GitHub: https://github.com/AbdalkarimA/iClusterVB
+* Source code: https://github.com/cran/iClusterVB
+* Date/Publication: 2024-08-20 19:10:02 UTC
+* Number of recursive dependencies: 127
-Run `revdepcheck::cloud_details(, "interactionRCS")` for more info
+Run `revdepcheck::cloud_details(, "iClusterVB")` for more info
## In both
-* checking whether package ‘interactionRCS’ can be installed ... ERROR
+* checking whether package ‘iClusterVB’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/interactionRCS/new/interactionRCS.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/iClusterVB/new/iClusterVB.Rcheck/00install.out’ for details.
```
## Installation
@@ -4268,10 +4908,17 @@ Run `revdepcheck::cloud_details(, "interactionRCS")` for more info
### Devel
```
-* installing *source* package ‘interactionRCS’ ...
-** package ‘interactionRCS’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘iClusterVB’ ...
+** package ‘iClusterVB’ successfully unpacked and MD5 sums checked
** using staged installation
+** libs
+using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c CAVI_algorithms.cpp -o CAVI_algorithms.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
+g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o iClusterVB.so CAVI_algorithms.o RcppExports.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR
+installing to /tmp/workdir/iClusterVB/new/iClusterVB.Rcheck/00LOCK-iClusterVB/00new/iClusterVB/libs
** R
+...
** data
*** moving datasets to lazyload DB
** inst
@@ -4280,18 +4927,25 @@ Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘interactionRCS’
-* removing ‘/tmp/workdir/interactionRCS/new/interactionRCS.Rcheck/interactionRCS’
+ERROR: lazy loading failed for package ‘iClusterVB’
+* removing ‘/tmp/workdir/iClusterVB/new/iClusterVB.Rcheck/iClusterVB’
```
### CRAN
```
-* installing *source* package ‘interactionRCS’ ...
-** package ‘interactionRCS’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘iClusterVB’ ...
+** package ‘iClusterVB’ successfully unpacked and MD5 sums checked
** using staged installation
+** libs
+using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c CAVI_algorithms.cpp -o CAVI_algorithms.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
+g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o iClusterVB.so CAVI_algorithms.o RcppExports.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR
+installing to /tmp/workdir/iClusterVB/old/iClusterVB.Rcheck/00LOCK-iClusterVB/00new/iClusterVB/libs
** R
+...
** data
*** moving datasets to lazyload DB
** inst
@@ -4300,8 +4954,8 @@ Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘interactionRCS’
-* removing ‘/tmp/workdir/interactionRCS/old/interactionRCS.Rcheck/interactionRCS’
+ERROR: lazy loading failed for package ‘iClusterVB’
+* removing ‘/tmp/workdir/iClusterVB/old/iClusterVB.Rcheck/iClusterVB’
```
@@ -4595,26 +5249,26 @@ ERROR: lazy loading failed for package ‘joineRML’
```
-# JWileymisc
+# kdml
-* Version: 1.4.1
-* GitHub: https://github.com/JWiley/JWileymisc
-* Source code: https://github.com/cran/JWileymisc
-* Date/Publication: 2023-10-05 04:50:02 UTC
-* Number of recursive dependencies: 167
+* Version: 1.0.0
+* GitHub: NA
+* Source code: https://github.com/cran/kdml
+* Date/Publication: 2024-08-27 11:30:05 UTC
+* Number of recursive dependencies: 40
-Run `revdepcheck::cloud_details(, "JWileymisc")` for more info
+Run `revdepcheck::cloud_details(, "kdml")` for more info
## In both
-* checking whether package ‘JWileymisc’ can be installed ... ERROR
+* checking whether package ‘kdml’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/JWileymisc/new/JWileymisc.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/kdml/new/kdml.Rcheck/00install.out’ for details.
```
## Installation
@@ -4622,99 +5276,194 @@ Run `revdepcheck::cloud_details(, "JWileymisc")` for more info
### Devel
```
-* installing *source* package ‘JWileymisc’ ...
-** package ‘JWileymisc’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘kdml’ ...
+** package ‘kdml’ successfully unpacked and MD5 sums checked
** using staged installation
** R
-** data
-*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Warning in check_dep_version() :
- ABI version mismatch:
-lme4 was built with Matrix ABI version 1
-Current Matrix ABI version is 0
-Please re-install lme4 from source or restore original ‘Matrix’ package
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Execution halted
-ERROR: lazy loading failed for package ‘JWileymisc’
-* removing ‘/tmp/workdir/JWileymisc/new/JWileymisc.Rcheck/JWileymisc’
+ERROR: lazy loading failed for package ‘kdml’
+* removing ‘/tmp/workdir/kdml/new/kdml.Rcheck/kdml’
```
### CRAN
```
-* installing *source* package ‘JWileymisc’ ...
-** package ‘JWileymisc’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘kdml’ ...
+** package ‘kdml’ successfully unpacked and MD5 sums checked
** using staged installation
** R
-** data
-*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Warning in check_dep_version() :
- ABI version mismatch:
-lme4 was built with Matrix ABI version 1
-Current Matrix ABI version is 0
-Please re-install lme4 from source or restore original ‘Matrix’ package
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Error: package or namespace load failed for ‘np’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Execution halted
-ERROR: lazy loading failed for package ‘JWileymisc’
-* removing ‘/tmp/workdir/JWileymisc/old/JWileymisc.Rcheck/JWileymisc’
+ERROR: lazy loading failed for package ‘kdml’
+* removing ‘/tmp/workdir/kdml/old/kdml.Rcheck/kdml’
```
-# L2E
+# kibior
-* Version: 2.0
-* GitHub: NA
-* Source code: https://github.com/cran/L2E
-* Date/Publication: 2022-09-08 21:13:00 UTC
-* Number of recursive dependencies: 65
+* Version: 0.1.1
+* GitHub: https://github.com/regisoc/kibior
+* Source code: https://github.com/cran/kibior
+* Date/Publication: 2021-01-28 15:20:02 UTC
+* Number of recursive dependencies: 140
-Run `revdepcheck::cloud_details(, "L2E")` for more info
+Run `revdepcheck::cloud_details(, "kibior")` for more info
-## In both
-
-* checking whether package ‘L2E’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/L2E/new/L2E.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘L2E’ ...
-** package ‘L2E’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘osqp’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.1 is required
-Execution halted
-ERROR: lazy loading failed for package ‘L2E’
-* removing ‘/tmp/workdir/L2E/new/L2E.Rcheck/L2E’
-
-
-```
-### CRAN
-
-```
+* using log directory ‘/tmp/workdir/kibior/new/kibior.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘kibior/DESCRIPTION’ ... OK
+...
+* this is package ‘kibior’ version ‘0.1.1’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘rtracklayer’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/kibior/old/kibior.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘kibior/DESCRIPTION’ ... OK
+...
+* this is package ‘kibior’ version ‘0.1.1’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘rtracklayer’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# kstMatrix
+
+
+
+* Version: NA
+* GitHub: NA
+* Source code: https://github.com/cran/kstMatrix
+* Number of recursive dependencies: 35
+
+Run `revdepcheck::cloud_details(, "kstMatrix")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+
+
+
+
+
+
+```
+### CRAN
+
+```
+
+
+
+
+
+
+```
+# L2E
+
+
+
+* Version: 2.0
+* GitHub: NA
+* Source code: https://github.com/cran/L2E
+* Date/Publication: 2022-09-08 21:13:00 UTC
+* Number of recursive dependencies: 65
+
+Run `revdepcheck::cloud_details(, "L2E")` for more info
+
+
+
+## In both
+
+* checking whether package ‘L2E’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/L2E/new/L2E.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘L2E’ ...
+** package ‘L2E’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error: package or namespace load failed for ‘osqp’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
+ namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.1 is required
+Execution halted
+ERROR: lazy loading failed for package ‘L2E’
+* removing ‘/tmp/workdir/L2E/new/L2E.Rcheck/L2E’
+
+
+```
+### CRAN
+
+```
* installing *source* package ‘L2E’ ...
** package ‘L2E’ successfully unpacked and MD5 sums checked
** using staged installation
@@ -4794,6 +5543,158 @@ ERROR: lazy loading failed for package ‘lchemix’
* removing ‘/tmp/workdir/lchemix/old/lchemix.Rcheck/lchemix’
+```
+# ldsep
+
+
+
+* Version: 2.1.5
+* GitHub: https://github.com/dcgerard/ldsep
+* Source code: https://github.com/cran/ldsep
+* Date/Publication: 2022-10-18 22:52:43 UTC
+* Number of recursive dependencies: 161
+
+Run `revdepcheck::cloud_details(, "ldsep")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/ldsep/new/ldsep.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘ldsep/DESCRIPTION’ ... OK
+...
+
+ When sourcing ‘vcf.R’:
+Error: there is no package called ‘VariantAnnotation’
+Execution halted
+
+ ‘fast.Rmd’ using ‘UTF-8’... OK
+ ‘vcf.Rmd’ using ‘UTF-8’... failed
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 WARNING, 3 NOTEs
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/ldsep/old/ldsep.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘ldsep/DESCRIPTION’ ... OK
+...
+
+ When sourcing ‘vcf.R’:
+Error: there is no package called ‘VariantAnnotation’
+Execution halted
+
+ ‘fast.Rmd’ using ‘UTF-8’... OK
+ ‘vcf.Rmd’ using ‘UTF-8’... failed
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 WARNING, 3 NOTEs
+
+
+
+
+
+```
+# locuszoomr
+
+
+
+* Version: 0.3.2
+* GitHub: https://github.com/myles-lewis/locuszoomr
+* Source code: https://github.com/cran/locuszoomr
+* Date/Publication: 2024-08-19 15:10:02 UTC
+* Number of recursive dependencies: 132
+
+Run `revdepcheck::cloud_details(, "locuszoomr")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/locuszoomr/new/locuszoomr.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘locuszoomr/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'ensembldb', 'rtracklayer'
+
+Package suggested but not available for checking: ‘EnsDb.Hsapiens.v75’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/locuszoomr/old/locuszoomr.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘locuszoomr/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'ensembldb', 'rtracklayer'
+
+Package suggested but not available for checking: ‘EnsDb.Hsapiens.v75’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
```
# loon.shiny
@@ -5029,10 +5930,10 @@ ERROR: lazy loading failed for package ‘LorenzRegression’
-* Version: 1.3.1
+* Version: 1.3.3
* GitHub: NA
* Source code: https://github.com/cran/lsirm12pl
-* Date/Publication: 2023-06-22 14:12:35 UTC
+* Date/Publication: 2024-08-28 23:00:02 UTC
* Number of recursive dependencies: 124
Run `revdepcheck::cloud_details(, "lsirm12pl")` for more info
@@ -5058,10 +5959,10 @@ Run `revdepcheck::cloud_details(, "lsirm12pl")` for more info
** libs
using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c log_likelihood.cpp -o log_likelihood.o
g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl.cpp -o lsirm1pl.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl_fixed_gamma.cpp -o lsirm1pl_fixed_gamma.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl_fixed_gamma_mar.cpp -o lsirm1pl_fixed_gamma_mar.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm2pl.cpp -o lsirm2pl.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsm.cpp -o lsm.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c utility_cpp.cpp -o utility_cpp.o
...
** R
** data
@@ -5085,10 +5986,10 @@ ERROR: lazy loading failed for package ‘lsirm12pl’
** libs
using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c log_likelihood.cpp -o log_likelihood.o
g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl.cpp -o lsirm1pl.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl_fixed_gamma.cpp -o lsirm1pl_fixed_gamma.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm1pl_fixed_gamma_mar.cpp -o lsirm1pl_fixed_gamma_mar.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsirm2pl.cpp -o lsirm2pl.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c lsm.cpp -o lsm.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c utility_cpp.cpp -o utility_cpp.o
...
** R
** data
@@ -5103,26 +6004,102 @@ ERROR: lazy loading failed for package ‘lsirm12pl’
```
-# MBmca
+# MAAPER
-* Version: 1.0.1-3
-* GitHub: https://github.com/PCRuniversum/MBmca
-* Source code: https://github.com/cran/MBmca
-* Date/Publication: 2021-09-03 12:40:08 UTC
-* Number of recursive dependencies: 58
+* Version: 1.1.1
+* GitHub: https://github.com/Vivianstats/MAAPER
+* Source code: https://github.com/cran/MAAPER
+* Date/Publication: 2021-08-14 14:20:05 UTC
+* Number of recursive dependencies: 84
-Run `revdepcheck::cloud_details(, "MBmca")` for more info
+Run `revdepcheck::cloud_details(, "MAAPER")` for more info
-## In both
+## Error before installation
-* checking whether package ‘MBmca’ can be installed ... ERROR
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/MAAPER/new/MAAPER.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MAAPER/DESCRIPTION’ ... OK
+...
+* this is package ‘MAAPER’ version ‘1.1.1’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘GenomicFeatures’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/MAAPER/old/MAAPER.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MAAPER/DESCRIPTION’ ... OK
+...
+* this is package ‘MAAPER’ version ‘1.1.1’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘GenomicFeatures’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# marlod
+
+
+
+* Version: 0.1.1
+* GitHub: NA
+* Source code: https://github.com/cran/marlod
+* Date/Publication: 2024-08-27 22:00:02 UTC
+* Number of recursive dependencies: 107
+
+Run `revdepcheck::cloud_details(, "marlod")` for more info
+
+
+
+## In both
+
+* checking whether package ‘marlod’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/MBmca/new/MBmca.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/marlod/new/marlod.Rcheck/00install.out’ for details.
```
## Installation
@@ -5130,8 +6107,8 @@ Run `revdepcheck::cloud_details(, "MBmca")` for more info
### Devel
```
-* installing *source* package ‘MBmca’ ...
-** package ‘MBmca’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘marlod’ ...
+** package ‘marlod’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
@@ -5142,16 +6119,16 @@ Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘MBmca’
-* removing ‘/tmp/workdir/MBmca/new/MBmca.Rcheck/MBmca’
+ERROR: lazy loading failed for package ‘marlod’
+* removing ‘/tmp/workdir/marlod/new/marlod.Rcheck/marlod’
```
### CRAN
```
-* installing *source* package ‘MBmca’ ...
-** package ‘MBmca’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘marlod’ ...
+** package ‘marlod’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
@@ -5162,31 +6139,107 @@ Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘MBmca’
-* removing ‘/tmp/workdir/MBmca/old/MBmca.Rcheck/MBmca’
+ERROR: lazy loading failed for package ‘marlod’
+* removing ‘/tmp/workdir/marlod/old/marlod.Rcheck/marlod’
```
-# mbsts
+# MARVEL
-* Version: 3.0
+* Version: 1.4.0
* GitHub: NA
-* Source code: https://github.com/cran/mbsts
-* Date/Publication: 2023-01-07 01:10:02 UTC
-* Number of recursive dependencies: 82
+* Source code: https://github.com/cran/MARVEL
+* Date/Publication: 2022-10-31 10:22:50 UTC
+* Number of recursive dependencies: 231
-Run `revdepcheck::cloud_details(, "mbsts")` for more info
+Run `revdepcheck::cloud_details(, "MARVEL")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/MARVEL/new/MARVEL.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MARVEL/DESCRIPTION’ ... OK
+...
+* checking installed files from ‘inst/doc’ ... OK
+* checking files in ‘vignettes’ ... OK
+* checking examples ... OK
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘MARVEL.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/MARVEL/old/MARVEL.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MARVEL/DESCRIPTION’ ... OK
+...
+* checking installed files from ‘inst/doc’ ... OK
+* checking files in ‘vignettes’ ... OK
+* checking examples ... OK
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘MARVEL.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
+
+
+
+
+
+```
+# MBmca
+
+
+
+* Version: 1.0.1-3
+* GitHub: https://github.com/PCRuniversum/MBmca
+* Source code: https://github.com/cran/MBmca
+* Date/Publication: 2021-09-03 12:40:08 UTC
+* Number of recursive dependencies: 58
+
+Run `revdepcheck::cloud_details(, "MBmca")` for more info
## In both
-* checking whether package ‘mbsts’ can be installed ... ERROR
+* checking whether package ‘MBmca’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/mbsts/new/mbsts.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/MBmca/new/MBmca.Rcheck/00install.out’ for details.
```
## Installation
@@ -5194,59 +6247,63 @@ Run `revdepcheck::cloud_details(, "mbsts")` for more info
### Devel
```
-* installing *source* package ‘mbsts’ ...
-** package ‘mbsts’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘MBmca’ ...
+** package ‘MBmca’ successfully unpacked and MD5 sums checked
** using staged installation
** R
+** data
+*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘mbsts’
-* removing ‘/tmp/workdir/mbsts/new/mbsts.Rcheck/mbsts’
+ERROR: lazy loading failed for package ‘MBmca’
+* removing ‘/tmp/workdir/MBmca/new/MBmca.Rcheck/MBmca’
```
### CRAN
```
-* installing *source* package ‘mbsts’ ...
-** package ‘mbsts’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘MBmca’ ...
+** package ‘MBmca’ successfully unpacked and MD5 sums checked
** using staged installation
** R
+** data
+*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘mbsts’
-* removing ‘/tmp/workdir/mbsts/old/mbsts.Rcheck/mbsts’
+ERROR: lazy loading failed for package ‘MBmca’
+* removing ‘/tmp/workdir/MBmca/old/MBmca.Rcheck/MBmca’
```
-# MendelianRandomization
+# mbsts
-* Version: 0.10.0
+* Version: 3.0
* GitHub: NA
-* Source code: https://github.com/cran/MendelianRandomization
-* Date/Publication: 2024-04-12 10:10:02 UTC
-* Number of recursive dependencies: 88
+* Source code: https://github.com/cran/mbsts
+* Date/Publication: 2023-01-07 01:10:02 UTC
+* Number of recursive dependencies: 82
-Run `revdepcheck::cloud_details(, "MendelianRandomization")` for more info
+Run `revdepcheck::cloud_details(, "mbsts")` for more info
## In both
-* checking whether package ‘MendelianRandomization’ can be installed ... ERROR
+* checking whether package ‘mbsts’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/MendelianRandomization/new/MendelianRandomization.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/mbsts/new/mbsts.Rcheck/00install.out’ for details.
```
## Installation
@@ -5254,15 +6311,9 @@ Run `revdepcheck::cloud_details(, "MendelianRandomization")` for more info
### Devel
```
-* installing *source* package ‘MendelianRandomization’ ...
-** package ‘MendelianRandomization’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘mbsts’ ...
+** package ‘mbsts’ successfully unpacked and MD5 sums checked
** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c mvmrcML.cpp -o mvmrcML.o
-g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o MendelianRandomization.so RcppExports.o mvmrcML.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/MendelianRandomization/new/MendelianRandomization.Rcheck/00LOCK-MendelianRandomization/00new/MendelianRandomization/libs
** R
** inst
** byte-compile and prepare package for lazy loading
@@ -5270,23 +6321,17 @@ Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘MendelianRandomization’
-* removing ‘/tmp/workdir/MendelianRandomization/new/MendelianRandomization.Rcheck/MendelianRandomization’
+ERROR: lazy loading failed for package ‘mbsts’
+* removing ‘/tmp/workdir/mbsts/new/mbsts.Rcheck/mbsts’
```
### CRAN
```
-* installing *source* package ‘MendelianRandomization’ ...
-** package ‘MendelianRandomization’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘mbsts’ ...
+** package ‘mbsts’ successfully unpacked and MD5 sums checked
** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fopenmp -fpic -g -O2 -c mvmrcML.cpp -o mvmrcML.o
-g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o MendelianRandomization.so RcppExports.o mvmrcML.o -fopenmp -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/MendelianRandomization/old/MendelianRandomization.Rcheck/00LOCK-MendelianRandomization/00new/MendelianRandomization/libs
** R
** inst
** byte-compile and prepare package for lazy loading
@@ -5294,72 +6339,84 @@ Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘MendelianRandomization’
-* removing ‘/tmp/workdir/MendelianRandomization/old/MendelianRandomization.Rcheck/MendelianRandomization’
+ERROR: lazy loading failed for package ‘mbsts’
+* removing ‘/tmp/workdir/mbsts/old/mbsts.Rcheck/mbsts’
```
-# MetabolicSurv
+# Mega2R
-* Version: 1.1.2
-* GitHub: https://github.com/OlajumokeEvangelina/MetabolicSurv
-* Source code: https://github.com/cran/MetabolicSurv
-* Date/Publication: 2021-06-11 08:30:02 UTC
-* Number of recursive dependencies: 131
+* Version: 1.1.0
+* GitHub: NA
+* Source code: https://github.com/cran/Mega2R
+* Date/Publication: 2023-12-21 22:40:10 UTC
+* Number of recursive dependencies: 105
-Run `revdepcheck::cloud_details(, "MetabolicSurv")` for more info
+Run `revdepcheck::cloud_details(, "Mega2R")` for more info
-## In both
-
-* checking whether package ‘MetabolicSurv’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/MetabolicSurv/new/MetabolicSurv.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘MetabolicSurv’ ...
-** package ‘MetabolicSurv’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘MetabolicSurv’
-* removing ‘/tmp/workdir/MetabolicSurv/new/MetabolicSurv.Rcheck/MetabolicSurv’
+* using log directory ‘/tmp/workdir/Mega2R/new/Mega2R.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘Mega2R/DESCRIPTION’ ... OK
+...
+* checking installed files from ‘inst/doc’ ... OK
+* checking files in ‘vignettes’ ... OK
+* checking examples ... OK
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘mega2rtutorial.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
+
+
+
```
### CRAN
```
-* installing *source* package ‘MetabolicSurv’ ...
-** package ‘MetabolicSurv’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘MetabolicSurv’
-* removing ‘/tmp/workdir/MetabolicSurv/old/MetabolicSurv.Rcheck/MetabolicSurv’
+* using log directory ‘/tmp/workdir/Mega2R/old/Mega2R.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘Mega2R/DESCRIPTION’ ... OK
+...
+* checking installed files from ‘inst/doc’ ... OK
+* checking files in ‘vignettes’ ... OK
+* checking examples ... OK
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘mega2rtutorial.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
+
+
+
```
@@ -5367,10 +6424,10 @@ ERROR: lazy loading failed for package ‘MetabolicSurv’
-* Version: 0.3.0
-* GitHub: https://github.com/nceas/metajam
+* Version: 0.3.1
+* GitHub: https://github.com/NCEAS/metajam
* Source code: https://github.com/cran/metajam
-* Date/Publication: 2024-07-03 07:20:05 UTC
+* Date/Publication: 2024-08-16 17:50:02 UTC
* Number of recursive dependencies: 91
Run `revdepcheck::cloud_details(, "metajam")` for more info
@@ -5503,67 +6560,79 @@ ERROR: lazy loading failed for package ‘mHMMbayes’
```
-# miceafter
+# MicroSEC
-* Version: 0.5.0
-* GitHub: https://github.com/mwheymans/miceafter
-* Source code: https://github.com/cran/miceafter
-* Date/Publication: 2022-10-02 13:30:02 UTC
-* Number of recursive dependencies: 140
+* Version: 2.1.6
+* GitHub: https://github.com/MANO-B/MicroSEC
+* Source code: https://github.com/cran/MicroSEC
+* Date/Publication: 2024-08-25 07:50:05 UTC
+* Number of recursive dependencies: 88
-Run `revdepcheck::cloud_details(, "miceafter")` for more info
+Run `revdepcheck::cloud_details(, "MicroSEC")` for more info
-## In both
-
-* checking whether package ‘miceafter’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/miceafter/new/miceafter.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘miceafter’ ...
-** package ‘miceafter’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+* using log directory ‘/tmp/workdir/MicroSEC/new/MicroSEC.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MicroSEC/DESCRIPTION’ ... OK
+...
+there is no package called 'BSgenome.Hsapiens.UCSC.hg38'
+--- failed re-building ‘my-vignette.Rmd’
+
+SUMMARY: processing the following file failed:
+ ‘my-vignette.Rmd’
+
Execution halted
-ERROR: lazy loading failed for package ‘miceafter’
-* removing ‘/tmp/workdir/miceafter/new/miceafter.Rcheck/miceafter’
+
+* DONE
+Status: 2 ERRORs, 2 NOTEs
+
+
+
```
### CRAN
```
-* installing *source* package ‘miceafter’ ...
-** package ‘miceafter’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+* using log directory ‘/tmp/workdir/MicroSEC/old/MicroSEC.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MicroSEC/DESCRIPTION’ ... OK
+...
+there is no package called 'BSgenome.Hsapiens.UCSC.hg38'
+--- failed re-building ‘my-vignette.Rmd’
+
+SUMMARY: processing the following file failed:
+ ‘my-vignette.Rmd’
+
Execution halted
-ERROR: lazy loading failed for package ‘miceafter’
-* removing ‘/tmp/workdir/miceafter/old/miceafter.Rcheck/miceafter’
+
+* DONE
+Status: 2 ERRORs, 2 NOTEs
+
+
+
```
@@ -5630,6 +6699,82 @@ ERROR: lazy loading failed for package ‘MiRKAT’
* removing ‘/tmp/workdir/MiRKAT/old/MiRKAT.Rcheck/MiRKAT’
+```
+# MitoHEAR
+
+
+
+* Version: 0.1.0
+* GitHub: NA
+* Source code: https://github.com/cran/MitoHEAR
+* Date/Publication: 2022-03-01 21:20:02 UTC
+* Number of recursive dependencies: 183
+
+Run `revdepcheck::cloud_details(, "MitoHEAR")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/MitoHEAR/new/MitoHEAR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MitoHEAR/DESCRIPTION’ ... OK
+...
+* checking package dependencies ... ERROR
+Package required but not available: ‘ComplexHeatmap’
+
+Packages suggested but not available for checking:
+ 'karyoploteR', 'regioneR'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/MitoHEAR/old/MitoHEAR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MitoHEAR/DESCRIPTION’ ... OK
+...
+* checking package dependencies ... ERROR
+Package required but not available: ‘ComplexHeatmap’
+
+Packages suggested but not available for checking:
+ 'karyoploteR', 'regioneR'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
```
# miWQS
@@ -5639,7 +6784,7 @@ ERROR: lazy loading failed for package ‘MiRKAT’
* GitHub: https://github.com/phargarten2/miWQS
* Source code: https://github.com/cran/miWQS
* Date/Publication: 2021-04-02 21:50:02 UTC
-* Number of recursive dependencies: 151
+* Number of recursive dependencies: 152
Run `revdepcheck::cloud_details(, "miWQS")` for more info
@@ -5695,145 +6840,315 @@ ERROR: lazy loading failed for package ‘miWQS’
```
-# mlt.docreg
+# MLML2R
-* Version: 1.1-8
-* GitHub: NA
-* Source code: https://github.com/cran/mlt.docreg
-* Date/Publication: 2024-04-29 13:40:02 UTC
-* Number of recursive dependencies: 152
+* Version: 0.3.3
+* GitHub: https://github.com/samarafk/MLML2R
+* Source code: https://github.com/cran/MLML2R
+* Date/Publication: 2019-10-17 19:30:02 UTC
+* Number of recursive dependencies: 146
-Run `revdepcheck::cloud_details(, "mlt.docreg")` for more info
+Run `revdepcheck::cloud_details(, "MLML2R")` for more info
-## In both
-
-* checking whether package ‘mlt.docreg’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/mlt.docreg/new/mlt.docreg.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘mlt.docreg’ ...
-** package ‘mlt.docreg’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘mlt’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- there is no package called ‘coneproj’
-Execution halted
-ERROR: lazy loading failed for package ‘mlt.docreg’
-* removing ‘/tmp/workdir/mlt.docreg/new/mlt.docreg.Rcheck/mlt.docreg’
+* using log directory ‘/tmp/workdir/MLML2R/new/MLML2R.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MLML2R/DESCRIPTION’ ... OK
+...
+* checking installed files from ‘inst/doc’ ... OK
+* checking files in ‘vignettes’ ... OK
+* checking examples ... OK
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘vignette.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
+
+
+
```
### CRAN
```
-* installing *source* package ‘mlt.docreg’ ...
-** package ‘mlt.docreg’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘mlt’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- there is no package called ‘coneproj’
-Execution halted
-ERROR: lazy loading failed for package ‘mlt.docreg’
-* removing ‘/tmp/workdir/mlt.docreg/old/mlt.docreg.Rcheck/mlt.docreg’
+* using log directory ‘/tmp/workdir/MLML2R/old/MLML2R.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MLML2R/DESCRIPTION’ ... OK
+...
+* checking installed files from ‘inst/doc’ ... OK
+* checking files in ‘vignettes’ ... OK
+* checking examples ... OK
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘vignette.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
+
+
+
```
-# modeLLtest
+# mlt.docreg
-* Version: 1.0.4
-* GitHub: https://github.com/ShanaScogin/modeLLtest
-* Source code: https://github.com/cran/modeLLtest
-* Date/Publication: 2022-05-05 23:20:17 UTC
-* Number of recursive dependencies: 58
+* Version: 1.1-8
+* GitHub: NA
+* Source code: https://github.com/cran/mlt.docreg
+* Date/Publication: 2024-04-29 13:40:02 UTC
+* Number of recursive dependencies: 152
-Run `revdepcheck::cloud_details(, "modeLLtest")` for more info
+Run `revdepcheck::cloud_details(, "mlt.docreg")` for more info
-## In both
-
-* checking whether package ‘modeLLtest’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/modeLLtest/new/modeLLtest.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘modeLLtest’ ...
-** package ‘modeLLtest’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using C++11
-g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_mr.cpp -o cvll_mr.o
-g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_ols.cpp -o cvll_ols.o
-g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_rlm_m.cpp -o cvll_rlm_m.o
+* using log directory ‘/tmp/workdir/mlt.docreg/new/mlt.docreg.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘mlt.docreg/DESCRIPTION’ ... OK
...
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘modeLLtest’
-* removing ‘/tmp/workdir/modeLLtest/new/modeLLtest.Rcheck/modeLLtest’
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘mlt’
+
+Packages suggested but not available for checking: 'tram', 'rms'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘modeLLtest’ ...
-** package ‘modeLLtest’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using C++11
-g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_mr.cpp -o cvll_mr.o
-g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_ols.cpp -o cvll_ols.o
-g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_rlm_m.cpp -o cvll_rlm_m.o
+* using log directory ‘/tmp/workdir/mlt.docreg/old/mlt.docreg.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘mlt.docreg/DESCRIPTION’ ... OK
...
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘modeLLtest’
-* removing ‘/tmp/workdir/modeLLtest/old/modeLLtest.Rcheck/modeLLtest’
-
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘mlt’
-```
-# MRZero
+Packages suggested but not available for checking: 'tram', 'rms'
-
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# MOCHA
+
+
+
+* Version: 1.1.0
+* GitHub: NA
+* Source code: https://github.com/cran/MOCHA
+* Date/Publication: 2024-01-25 12:20:12 UTC
+* Number of recursive dependencies: 249
+
+Run `revdepcheck::cloud_details(, "MOCHA")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/MOCHA/new/MOCHA.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MOCHA/DESCRIPTION’ ... OK
+...
+
+Packages suggested but not available for checking:
+ 'ArchR', 'motifmatchr', 'TxDb.Hsapiens.UCSC.hg38.refGene',
+ 'TxDb.Hsapiens.UCSC.hg19.knownGene', 'BSgenome.Hsapiens.UCSC.hg19',
+ 'chromVAR', 'rtracklayer'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/MOCHA/old/MOCHA.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘MOCHA/DESCRIPTION’ ... OK
+...
+
+Packages suggested but not available for checking:
+ 'ArchR', 'motifmatchr', 'TxDb.Hsapiens.UCSC.hg38.refGene',
+ 'TxDb.Hsapiens.UCSC.hg19.knownGene', 'BSgenome.Hsapiens.UCSC.hg19',
+ 'chromVAR', 'rtracklayer'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# modeLLtest
+
+
+
+* Version: 1.0.4
+* GitHub: https://github.com/ShanaScogin/modeLLtest
+* Source code: https://github.com/cran/modeLLtest
+* Date/Publication: 2022-05-05 23:20:17 UTC
+* Number of recursive dependencies: 58
+
+Run `revdepcheck::cloud_details(, "modeLLtest")` for more info
+
+
+
+## In both
+
+* checking whether package ‘modeLLtest’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/modeLLtest/new/modeLLtest.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘modeLLtest’ ...
+** package ‘modeLLtest’ successfully unpacked and MD5 sums checked
+** using staged installation
+** libs
+using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
+using C++11
+g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
+g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_mr.cpp -o cvll_mr.o
+g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_ols.cpp -o cvll_ols.o
+g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_rlm_m.cpp -o cvll_rlm_m.o
+...
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘modeLLtest’
+* removing ‘/tmp/workdir/modeLLtest/new/modeLLtest.Rcheck/modeLLtest’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘modeLLtest’ ...
+** package ‘modeLLtest’ successfully unpacked and MD5 sums checked
+** using staged installation
+** libs
+using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
+using C++11
+g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
+g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_mr.cpp -o cvll_mr.o
+g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_ols.cpp -o cvll_ols.o
+g++ -std=gnu++11 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c cvll_rlm_m.cpp -o cvll_rlm_m.o
+...
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘modeLLtest’
+* removing ‘/tmp/workdir/modeLLtest/old/modeLLtest.Rcheck/modeLLtest’
+
+
+```
+# MRZero
+
+
* Version: 0.2.0
* GitHub: NA
@@ -6059,14 +7374,14 @@ using C++17
g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
In file included from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205,
...
-/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_survival_mspline_namespace::model_survival_mspline; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’
+/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_survival_param_namespace::model_survival_param; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’
/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here
/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes]
654 | return internal::first_aligned::alignment),Derived>(m);
| ^~~~~~~~~
g++: fatal error: Killed signal terminated program cc1plus
compilation terminated.
-make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_mspline.o] Error 1
+make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_param.o] Error 1
ERROR: compilation failed for package ‘multinma’
* removing ‘/tmp/workdir/multinma/new/multinma.Rcheck/multinma’
@@ -6086,14 +7401,14 @@ using C++17
g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I"../inst/include" -I"/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src" -DBOOST_DISABLE_ASSERTS -DEIGEN_NO_DEBUG -DBOOST_MATH_OVERFLOW_ERROR_POLICY=errno_on_error -DUSE_STANC3 -D_HAS_AUTO_PTR_ETC=0 -I'/opt/R/4.3.1/lib/R/site-library/BH/include' -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppEigen/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -I'/opt/R/4.3.1/lib/R/site-library/rstan/include' -I'/opt/R/4.3.1/lib/R/site-library/StanHeaders/include' -I/usr/local/include -I'/opt/R/4.3.1/lib/R/site-library/RcppParallel/include' -D_REENTRANT -DSTAN_THREADS -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
In file included from /opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/Core:205,
...
-/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_survival_mspline_namespace::model_survival_mspline; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’
+/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:22:56: required from ‘double stan::mcmc::dense_e_metric::T(stan::mcmc::dense_e_point&) [with Model = model_survival_param_namespace::model_survival_param; BaseRNG = boost::random::additive_combine_engine, boost::random::linear_congruential_engine >]’
/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here
/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes]
654 | return internal::first_aligned::alignment),Derived>(m);
| ^~~~~~~~~
g++: fatal error: Killed signal terminated program cc1plus
compilation terminated.
-make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_mspline.o] Error 1
+make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stanExports_survival_param.o] Error 1
ERROR: compilation failed for package ‘multinma’
* removing ‘/tmp/workdir/multinma/old/multinma.Rcheck/multinma’
@@ -6305,7 +7620,7 @@ ERROR: lazy loading failed for package ‘nebula’
* GitHub: https://github.com/jongheepark/NetworkChange
* Source code: https://github.com/cran/NetworkChange
* Date/Publication: 2022-03-04 07:30:02 UTC
-* Number of recursive dependencies: 132
+* Number of recursive dependencies: 133
Run `revdepcheck::cloud_details(, "NetworkChange")` for more info
@@ -6543,150 +7858,240 @@ ERROR: lazy loading failed for package ‘noncomplyR’
```
-# ontologics
+# ohun
-* Version: 0.7.0
-* GitHub: https://github.com/luckinet/ontologics
-* Source code: https://github.com/cran/ontologics
-* Date/Publication: 2023-05-10 09:20:05 UTC
-* Number of recursive dependencies: 80
+* Version: 1.0.2
+* GitHub: https://github.com/ropensci/ohun
+* Source code: https://github.com/cran/ohun
+* Date/Publication: 2024-08-19 18:40:02 UTC
+* Number of recursive dependencies: 100
-Run `revdepcheck::cloud_details(, "ontologics")` for more info
+Run `revdepcheck::cloud_details(, "ohun")` for more info
-## In both
-
-* checking whether package ‘ontologics’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘ontologics’ ...
-** package ‘ontologics’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in dyn.load(file, DLLpath = DLLpath, ...) :
- unable to load shared object '/opt/R/4.3.1/lib/R/site-library/redland/libs/redland.so':
- librdf.so.0: cannot open shared object file: No such file or directory
-Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load
-Execution halted
-ERROR: lazy loading failed for package ‘ontologics’
-* removing ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/ontologics’
+* using log directory ‘/tmp/workdir/ohun/new/ohun.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘ohun/DESCRIPTION’ ... OK
+...
+* this is package ‘ohun’ version ‘1.0.2’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘warbleR’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘ontologics’ ...
-** package ‘ontologics’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in dyn.load(file, DLLpath = DLLpath, ...) :
- unable to load shared object '/opt/R/4.3.1/lib/R/site-library/redland/libs/redland.so':
- librdf.so.0: cannot open shared object file: No such file or directory
-Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load
-Execution halted
-ERROR: lazy loading failed for package ‘ontologics’
-* removing ‘/tmp/workdir/ontologics/old/ontologics.Rcheck/ontologics’
+* using log directory ‘/tmp/workdir/ohun/old/ohun.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘ohun/DESCRIPTION’ ... OK
+...
+* this is package ‘ohun’ version ‘1.0.2’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘warbleR’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
-# OVtool
+# oncoPredict
-* Version: 1.0.3
-* GitHub: NA
-* Source code: https://github.com/cran/OVtool
-* Date/Publication: 2021-11-02 08:10:07 UTC
-* Number of recursive dependencies: 157
+* Version: 1.2
+* GitHub: https://github.com/HuangLabUMN/oncoPredict
+* Source code: https://github.com/cran/oncoPredict
+* Date/Publication: 2024-04-05 07:53:00 UTC
+* Number of recursive dependencies: 208
-Run `revdepcheck::cloud_details(, "OVtool")` for more info
+Run `revdepcheck::cloud_details(, "oncoPredict")` for more info
-## In both
-
-* checking whether package ‘OVtool’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/OVtool/new/OVtool.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘OVtool’ ...
-** package ‘OVtool’ successfully unpacked and MD5 sums checked
-** using staged installation
+* using log directory ‘/tmp/workdir/oncoPredict/new/oncoPredict.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘oncoPredict/DESCRIPTION’ ... OK
+...
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available:
+ 'GenomicFeatures', 'TxDb.Hsapiens.UCSC.hg19.knownGene'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/oncoPredict/old/oncoPredict.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘oncoPredict/DESCRIPTION’ ... OK
+...
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available:
+ 'GenomicFeatures', 'TxDb.Hsapiens.UCSC.hg19.knownGene'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# ontologics
+
+
+
+* Version: 0.7.0
+* GitHub: https://github.com/luckinet/ontologics
+* Source code: https://github.com/cran/ontologics
+* Date/Publication: 2023-05-10 09:20:05 UTC
+* Number of recursive dependencies: 80
+
+Run `revdepcheck::cloud_details(, "ontologics")` for more info
+
+
+
+## In both
+
+* checking whether package ‘ontologics’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘ontologics’ ...
+** package ‘ontologics’ successfully unpacked and MD5 sums checked
+** using staged installation
** R
-** data
-*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘twang’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Error in dyn.load(file, DLLpath = DLLpath, ...) :
+ unable to load shared object '/opt/R/4.3.1/lib/R/site-library/redland/libs/redland.so':
+ librdf.so.0: cannot open shared object file: No such file or directory
+Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load
Execution halted
-ERROR: lazy loading failed for package ‘OVtool’
-* removing ‘/tmp/workdir/OVtool/new/OVtool.Rcheck/OVtool’
+ERROR: lazy loading failed for package ‘ontologics’
+* removing ‘/tmp/workdir/ontologics/new/ontologics.Rcheck/ontologics’
```
### CRAN
```
-* installing *source* package ‘OVtool’ ...
-** package ‘OVtool’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘ontologics’ ...
+** package ‘ontologics’ successfully unpacked and MD5 sums checked
** using staged installation
** R
-** data
-*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘twang’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Error in dyn.load(file, DLLpath = DLLpath, ...) :
+ unable to load shared object '/opt/R/4.3.1/lib/R/site-library/redland/libs/redland.so':
+ librdf.so.0: cannot open shared object file: No such file or directory
+Calls: ... asNamespace -> loadNamespace -> library.dynam -> dyn.load
Execution halted
-ERROR: lazy loading failed for package ‘OVtool’
-* removing ‘/tmp/workdir/OVtool/old/OVtool.Rcheck/OVtool’
+ERROR: lazy loading failed for package ‘ontologics’
+* removing ‘/tmp/workdir/ontologics/old/ontologics.Rcheck/ontologics’
```
-# paths
+# OVtool
-* Version: 0.1.1
+* Version: 1.0.3
* GitHub: NA
-* Source code: https://github.com/cran/paths
-* Date/Publication: 2021-06-18 08:40:02 UTC
-* Number of recursive dependencies: 102
+* Source code: https://github.com/cran/OVtool
+* Date/Publication: 2021-11-02 08:10:07 UTC
+* Number of recursive dependencies: 157
-Run `revdepcheck::cloud_details(, "paths")` for more info
+Run `revdepcheck::cloud_details(, "OVtool")` for more info
## In both
-* checking whether package ‘paths’ can be installed ... ERROR
+* checking whether package ‘OVtool’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/paths/new/paths.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/OVtool/new/OVtool.Rcheck/00install.out’ for details.
```
## Installation
@@ -6694,54 +8099,52 @@ Run `revdepcheck::cloud_details(, "paths")` for more info
### Devel
```
-* installing *source* package ‘paths’ ...
-** package ‘paths’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘OVtool’ ...
+** package ‘OVtool’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Error: package or namespace load failed for ‘twang’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Execution halted
-ERROR: lazy loading failed for package ‘paths’
-* removing ‘/tmp/workdir/paths/new/paths.Rcheck/paths’
+ERROR: lazy loading failed for package ‘OVtool’
+* removing ‘/tmp/workdir/OVtool/new/OVtool.Rcheck/OVtool’
```
### CRAN
```
-* installing *source* package ‘paths’ ...
-** package ‘paths’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘OVtool’ ...
+** package ‘OVtool’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Error: package or namespace load failed for ‘twang’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Execution halted
-ERROR: lazy loading failed for package ‘paths’
-* removing ‘/tmp/workdir/paths/old/paths.Rcheck/paths’
+ERROR: lazy loading failed for package ‘OVtool’
+* removing ‘/tmp/workdir/OVtool/old/OVtool.Rcheck/OVtool’
```
-# pencal
+# pagoda2
-* Version: 2.2.2
-* GitHub: NA
-* Source code: https://github.com/cran/pencal
-* Date/Publication: 2024-06-12 11:10:02 UTC
-* Number of recursive dependencies: 172
+* Version: 1.0.12
+* GitHub: https://github.com/kharchenkolab/pagoda2
+* Source code: https://github.com/cran/pagoda2
+* Date/Publication: 2024-02-27 00:50:02 UTC
+* Number of recursive dependencies: 162
-Run `revdepcheck::cloud_details(, "pencal")` for more info
+Run `revdepcheck::cloud_details(, "pagoda2")` for more info
@@ -6750,7 +8153,7 @@ Run `revdepcheck::cloud_details(, "pencal")` for more info
### Devel
```
-* using log directory ‘/tmp/workdir/pencal/new/pencal.Rcheck’
+* using log directory ‘/tmp/workdir/pagoda2/new/pagoda2.Rcheck’
* using R version 4.3.1 (2023-06-16)
* using platform: x86_64-pc-linux-gnu (64-bit)
* R was compiled by
@@ -6759,18 +8162,18 @@ Run `revdepcheck::cloud_details(, "pencal")` for more info
* running under: Ubuntu 22.04.4 LTS
* using session charset: UTF-8
* using option ‘--no-manual’
-* checking for file ‘pencal/DESCRIPTION’ ... OK
+* checking for file ‘pagoda2/DESCRIPTION’ ... OK
...
---- failed re-building ‘vignette.Rnw’
-
-SUMMARY: processing the following file failed:
- ‘vignette.Rnw’
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘rjson’
-Error: Vignette re-building failed.
-Execution halted
+Package suggested but not available for checking: ‘scde’
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
* DONE
-Status: 1 WARNING, 1 NOTE
+Status: 1 ERROR
@@ -6780,7 +8183,7 @@ Status: 1 WARNING, 1 NOTE
### CRAN
```
-* using log directory ‘/tmp/workdir/pencal/old/pencal.Rcheck’
+* using log directory ‘/tmp/workdir/pagoda2/old/pagoda2.Rcheck’
* using R version 4.3.1 (2023-06-16)
* using platform: x86_64-pc-linux-gnu (64-bit)
* R was compiled by
@@ -6789,44 +8192,44 @@ Status: 1 WARNING, 1 NOTE
* running under: Ubuntu 22.04.4 LTS
* using session charset: UTF-8
* using option ‘--no-manual’
-* checking for file ‘pencal/DESCRIPTION’ ... OK
+* checking for file ‘pagoda2/DESCRIPTION’ ... OK
...
---- failed re-building ‘vignette.Rnw’
-
-SUMMARY: processing the following file failed:
- ‘vignette.Rnw’
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘rjson’
-Error: Vignette re-building failed.
-Execution halted
+Package suggested but not available for checking: ‘scde’
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
* DONE
-Status: 1 WARNING, 1 NOTE
+Status: 1 ERROR
```
-# pez
+# PAMpal
-* Version: 1.2-4
+* Version: 1.2.1
* GitHub: NA
-* Source code: https://github.com/cran/pez
-* Date/Publication: 2022-08-31 18:00:02 UTC
-* Number of recursive dependencies: 71
+* Source code: https://github.com/cran/PAMpal
+* Date/Publication: 2024-07-11 22:50:02 UTC
+* Number of recursive dependencies: 118
-Run `revdepcheck::cloud_details(, "pez")` for more info
+Run `revdepcheck::cloud_details(, "PAMpal")` for more info
## In both
-* checking whether package ‘pez’ can be installed ... ERROR
+* checking whether package ‘PAMpal’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/pez/new/pez.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/PAMpal/new/PAMpal.Rcheck/00install.out’ for details.
```
## Installation
@@ -6834,125 +8237,92 @@ Run `revdepcheck::cloud_details(, "pez")` for more info
### Devel
```
-* installing *source* package ‘pez’ ...
-** package ‘pez’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘PAMpal’ ...
+** package ‘PAMpal’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
+*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+ there is no package called ‘rjson’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
-ERROR: lazy loading failed for package ‘pez’
-* removing ‘/tmp/workdir/pez/new/pez.Rcheck/pez’
+ERROR: lazy loading failed for package ‘PAMpal’
+* removing ‘/tmp/workdir/PAMpal/new/PAMpal.Rcheck/PAMpal’
```
### CRAN
```
-* installing *source* package ‘pez’ ...
-** package ‘pez’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘PAMpal’ ...
+** package ‘PAMpal’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
+*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+ there is no package called ‘rjson’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
-ERROR: lazy loading failed for package ‘pez’
-* removing ‘/tmp/workdir/pez/old/pez.Rcheck/pez’
+ERROR: lazy loading failed for package ‘PAMpal’
+* removing ‘/tmp/workdir/PAMpal/old/PAMpal.Rcheck/PAMpal’
```
-# piecewiseSEM
+# paths
-* Version: NA
+* Version: 0.1.1
* GitHub: NA
-* Source code: https://github.com/cran/piecewiseSEM
-* Number of recursive dependencies: 108
+* Source code: https://github.com/cran/paths
+* Date/Publication: 2021-06-18 08:40:02 UTC
+* Number of recursive dependencies: 102
-Run `revdepcheck::cloud_details(, "piecewiseSEM")` for more info
+Run `revdepcheck::cloud_details(, "paths")` for more info
-## Error before installation
-
-### Devel
-
-```
+## In both
+* checking whether package ‘paths’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/paths/new/paths.Rcheck/00install.out’ for details.
+ ```
+## Installation
+### Devel
+```
+* installing *source* package ‘paths’ ...
+** package ‘paths’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘paths’
+* removing ‘/tmp/workdir/paths/new/paths.Rcheck/paths’
```
### CRAN
```
-
-
-
-
-
-
-```
-# pould
-
-
-
-* Version: 1.0.1
-* GitHub: NA
-* Source code: https://github.com/cran/pould
-* Date/Publication: 2020-10-16 13:50:03 UTC
-* Number of recursive dependencies: 104
-
-Run `revdepcheck::cloud_details(, "pould")` for more info
-
-
-
-## In both
-
-* checking whether package ‘pould’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/pould/new/pould.Rcheck/00install.out’ for details.
- ```
-
-## Installation
-
-### Devel
-
-```
-* installing *source* package ‘pould’ ...
-** package ‘pould’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘pould’
-* removing ‘/tmp/workdir/pould/new/pould.Rcheck/pould’
-
-
-```
-### CRAN
-
-```
-* installing *source* package ‘pould’ ...
-** package ‘pould’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘paths’ ...
+** package ‘paths’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
@@ -6963,86 +8333,57 @@ Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘pould’
-* removing ‘/tmp/workdir/pould/old/pould.Rcheck/pould’
+ERROR: lazy loading failed for package ‘paths’
+* removing ‘/tmp/workdir/paths/old/paths.Rcheck/paths’
```
-# pre
+# PathwaySpace
-* Version: 1.0.7
-* GitHub: https://github.com/marjoleinF/pre
-* Source code: https://github.com/cran/pre
-* Date/Publication: 2024-01-12 19:30:02 UTC
-* Number of recursive dependencies: 151
+* Version: NA
+* GitHub: NA
+* Source code: https://github.com/cran/PathwaySpace
+* Number of recursive dependencies: 70
-Run `revdepcheck::cloud_details(, "pre")` for more info
+Run `revdepcheck::cloud_details(, "PathwaySpace")` for more info
-## In both
-
-* checking whether package ‘pre’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/pre/new/pre.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘pre’ ...
-** package ‘pre’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘pre’
-* removing ‘/tmp/workdir/pre/new/pre.Rcheck/pre’
+
+
+
+
```
### CRAN
```
-* installing *source* package ‘pre’ ...
-** package ‘pre’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘pre’
-* removing ‘/tmp/workdir/pre/old/pre.Rcheck/pre’
+
+
+
+
```
-# ProFAST
+# pencal
-* Version: 1.4
-* GitHub: https://github.com/feiyoung/ProFAST
-* Source code: https://github.com/cran/ProFAST
-* Date/Publication: 2024-03-18 08:10:06 UTC
-* Number of recursive dependencies: 245
+* Version: 2.2.2
+* GitHub: NA
+* Source code: https://github.com/cran/pencal
+* Date/Publication: 2024-06-12 11:10:02 UTC
+* Number of recursive dependencies: 172
-Run `revdepcheck::cloud_details(, "ProFAST")` for more info
+Run `revdepcheck::cloud_details(, "pencal")` for more info
@@ -7051,7 +8392,7 @@ Run `revdepcheck::cloud_details(, "ProFAST")` for more info
### Devel
```
-* using log directory ‘/tmp/workdir/ProFAST/new/ProFAST.Rcheck’
+* using log directory ‘/tmp/workdir/pencal/new/pencal.Rcheck’
* using R version 4.3.1 (2023-06-16)
* using platform: x86_64-pc-linux-gnu (64-bit)
* R was compiled by
@@ -7060,18 +8401,18 @@ Run `revdepcheck::cloud_details(, "ProFAST")` for more info
* running under: Ubuntu 22.04.4 LTS
* using session charset: UTF-8
* using option ‘--no-manual’
-* checking for file ‘ProFAST/DESCRIPTION’ ... OK
+* checking for file ‘pencal/DESCRIPTION’ ... OK
...
-* this is package ‘ProFAST’ version ‘1.4’
-* package encoding: UTF-8
-* checking package namespace information ... OK
-* checking package dependencies ... ERROR
-Packages required but not available: 'DR.SC', 'PRECAST'
+--- failed re-building ‘vignette.Rnw’
+
+SUMMARY: processing the following file failed:
+ ‘vignette.Rnw’
+
+Error: Vignette re-building failed.
+Execution halted
-See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
-manual.
* DONE
-Status: 1 ERROR
+Status: 1 WARNING, 1 NOTE
@@ -7081,7 +8422,7 @@ Status: 1 ERROR
### CRAN
```
-* using log directory ‘/tmp/workdir/ProFAST/old/ProFAST.Rcheck’
+* using log directory ‘/tmp/workdir/pencal/old/pencal.Rcheck’
* using R version 4.3.1 (2023-06-16)
* using platform: x86_64-pc-linux-gnu (64-bit)
* R was compiled by
@@ -7090,44 +8431,44 @@ Status: 1 ERROR
* running under: Ubuntu 22.04.4 LTS
* using session charset: UTF-8
* using option ‘--no-manual’
-* checking for file ‘ProFAST/DESCRIPTION’ ... OK
+* checking for file ‘pencal/DESCRIPTION’ ... OK
...
-* this is package ‘ProFAST’ version ‘1.4’
-* package encoding: UTF-8
-* checking package namespace information ... OK
-* checking package dependencies ... ERROR
-Packages required but not available: 'DR.SC', 'PRECAST'
+--- failed re-building ‘vignette.Rnw’
+
+SUMMARY: processing the following file failed:
+ ‘vignette.Rnw’
+
+Error: Vignette re-building failed.
+Execution halted
-See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
-manual.
* DONE
-Status: 1 ERROR
+Status: 1 WARNING, 1 NOTE
```
-# PRSPGx
+# pez
-* Version: 0.3.0
+* Version: 1.2-4
* GitHub: NA
-* Source code: https://github.com/cran/PRSPGx
-* Date/Publication: 2022-07-20 15:00:02 UTC
-* Number of recursive dependencies: 109
+* Source code: https://github.com/cran/pez
+* Date/Publication: 2022-08-31 18:00:02 UTC
+* Number of recursive dependencies: 71
-Run `revdepcheck::cloud_details(, "PRSPGx")` for more info
+Run `revdepcheck::cloud_details(, "pez")` for more info
## In both
-* checking whether package ‘PRSPGx’ can be installed ... ERROR
+* checking whether package ‘pez’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/PRSPGx/new/PRSPGx.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/pez/new/pez.Rcheck/00install.out’ for details.
```
## Installation
@@ -7135,213 +8476,172 @@ Run `revdepcheck::cloud_details(, "PRSPGx")` for more info
### Devel
```
-* installing *source* package ‘PRSPGx’ ...
-** package ‘PRSPGx’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘pez’ ...
+** package ‘pez’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
-*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘PRSPGx’
-* removing ‘/tmp/workdir/PRSPGx/new/PRSPGx.Rcheck/PRSPGx’
+ERROR: lazy loading failed for package ‘pez’
+* removing ‘/tmp/workdir/pez/new/pez.Rcheck/pez’
```
### CRAN
```
-* installing *source* package ‘PRSPGx’ ...
-** package ‘PRSPGx’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘pez’ ...
+** package ‘pez’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
-*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘PRSPGx’
-* removing ‘/tmp/workdir/PRSPGx/old/PRSPGx.Rcheck/PRSPGx’
+ERROR: lazy loading failed for package ‘pez’
+* removing ‘/tmp/workdir/pez/old/pez.Rcheck/pez’
```
-# psbcSpeedUp
+# piecewiseSEM
-* Version: 2.0.7
-* GitHub: https://github.com/ocbe-uio/psbcSpeedUp
-* Source code: https://github.com/cran/psbcSpeedUp
-* Date/Publication: 2024-07-01 09:00:02 UTC
-* Number of recursive dependencies: 129
+* Version: NA
+* GitHub: NA
+* Source code: https://github.com/cran/piecewiseSEM
+* Number of recursive dependencies: 108
-Run `revdepcheck::cloud_details(, "psbcSpeedUp")` for more info
+Run `revdepcheck::cloud_details(, "piecewiseSEM")` for more info
-## In both
-
-* checking whether package ‘psbcSpeedUp’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/psbcSpeedUp/new/psbcSpeedUp.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘psbcSpeedUp’ ...
-** package ‘psbcSpeedUp’ successfully unpacked and MD5 sums checked
-** using staged installation
-checking whether the C++ compiler works... yes
-checking for C++ compiler default output file name... a.out
-checking for suffix of executables...
-checking whether we are cross compiling... no
-checking for suffix of object files... o
-checking whether the compiler supports GNU C++... yes
-checking whether g++ -std=gnu++17 accepts -g... yes
-...
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘psbcSpeedUp’
-* removing ‘/tmp/workdir/psbcSpeedUp/new/psbcSpeedUp.Rcheck/psbcSpeedUp’
+
+
+
+
```
### CRAN
```
-* installing *source* package ‘psbcSpeedUp’ ...
-** package ‘psbcSpeedUp’ successfully unpacked and MD5 sums checked
-** using staged installation
-checking whether the C++ compiler works... yes
-checking for C++ compiler default output file name... a.out
-checking for suffix of executables...
-checking whether we are cross compiling... no
-checking for suffix of object files... o
-checking whether the compiler supports GNU C++... yes
-checking whether g++ -std=gnu++17 accepts -g... yes
-...
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘psbcSpeedUp’
-* removing ‘/tmp/workdir/psbcSpeedUp/old/psbcSpeedUp.Rcheck/psbcSpeedUp’
+
+
+
+
```
-# pscore
+# polyRAD
-* Version: 0.4.0
-* GitHub: https://github.com/JWiley/score-project
-* Source code: https://github.com/cran/pscore
-* Date/Publication: 2022-05-13 22:30:02 UTC
-* Number of recursive dependencies: 169
+* Version: 2.0.0
+* GitHub: https://github.com/lvclark/polyRAD
+* Source code: https://github.com/cran/polyRAD
+* Date/Publication: 2022-11-06 21:50:02 UTC
+* Number of recursive dependencies: 135
-Run `revdepcheck::cloud_details(, "pscore")` for more info
+Run `revdepcheck::cloud_details(, "polyRAD")` for more info
-## In both
-
-* checking whether package ‘pscore’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/pscore/new/pscore.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘pscore’ ...
-** package ‘pscore’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-** inst
-** byte-compile and prepare package for lazy loading
-Warning in check_dep_version() :
- ABI version mismatch:
-lme4 was built with Matrix ABI version 1
-Current Matrix ABI version is 0
-Please re-install lme4 from source or restore original ‘Matrix’ package
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+* using log directory ‘/tmp/workdir/polyRAD/new/polyRAD.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘polyRAD/DESCRIPTION’ ... OK
+...
+
+ When sourcing ‘polyRADtutorial.R’:
+Error: Probabilities must be finite and non-negative!
Execution halted
-ERROR: lazy loading failed for package ‘pscore’
-* removing ‘/tmp/workdir/pscore/new/pscore.Rcheck/pscore’
+
+ ‘isolocus_sorting.Rmd’ using ‘UTF-8’... OK
+ ‘polyRADtutorial.Rmd’ using ‘UTF-8’... failed
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 ERROR, 3 NOTEs
+
+
+
```
### CRAN
```
-* installing *source* package ‘pscore’ ...
-** package ‘pscore’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-** inst
-** byte-compile and prepare package for lazy loading
-Warning in check_dep_version() :
- ABI version mismatch:
-lme4 was built with Matrix ABI version 1
-Current Matrix ABI version is 0
-Please re-install lme4 from source or restore original ‘Matrix’ package
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+* using log directory ‘/tmp/workdir/polyRAD/old/polyRAD.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘polyRAD/DESCRIPTION’ ... OK
+...
+
+ When sourcing ‘polyRADtutorial.R’:
+Error: Probabilities must be finite and non-negative!
Execution halted
-ERROR: lazy loading failed for package ‘pscore’
-* removing ‘/tmp/workdir/pscore/old/pscore.Rcheck/pscore’
+
+ ‘isolocus_sorting.Rmd’ using ‘UTF-8’... OK
+ ‘polyRADtutorial.Rmd’ using ‘UTF-8’... failed
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 ERROR, 3 NOTEs
+
+
+
```
-# psfmi
+# pould
-* Version: 1.4.0
-* GitHub: https://github.com/mwheymans/psfmi
-* Source code: https://github.com/cran/psfmi
-* Date/Publication: 2023-06-17 22:40:02 UTC
-* Number of recursive dependencies: 164
+* Version: 1.0.1
+* GitHub: NA
+* Source code: https://github.com/cran/pould
+* Date/Publication: 2020-10-16 13:50:03 UTC
+* Number of recursive dependencies: 104
-Run `revdepcheck::cloud_details(, "psfmi")` for more info
+Run `revdepcheck::cloud_details(, "pould")` for more info
## In both
-* checking whether package ‘psfmi’ can be installed ... ERROR
+* checking whether package ‘pould’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/psfmi/new/psfmi.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/pould/new/pould.Rcheck/00install.out’ for details.
```
## Installation
@@ -7349,63 +8649,63 @@ Run `revdepcheck::cloud_details(, "psfmi")` for more info
### Devel
```
-* installing *source* package ‘psfmi’ ...
-** package ‘psfmi’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘pould’ ...
+** package ‘pould’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) :
+ there is no package called ‘rms’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
-ERROR: lazy loading failed for package ‘psfmi’
-* removing ‘/tmp/workdir/psfmi/new/psfmi.Rcheck/psfmi’
+ERROR: lazy loading failed for package ‘pould’
+* removing ‘/tmp/workdir/pould/new/pould.Rcheck/pould’
```
### CRAN
```
-* installing *source* package ‘psfmi’ ...
-** package ‘psfmi’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘pould’ ...
+** package ‘pould’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) :
+ there is no package called ‘rms’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
Execution halted
-ERROR: lazy loading failed for package ‘psfmi’
-* removing ‘/tmp/workdir/psfmi/old/psfmi.Rcheck/psfmi’
+ERROR: lazy loading failed for package ‘pould’
+* removing ‘/tmp/workdir/pould/old/pould.Rcheck/pould’
```
-# pssmooth
+# pre
-* Version: 1.0.3
-* GitHub: https://github.com/mjuraska/pssmooth
-* Source code: https://github.com/cran/pssmooth
-* Date/Publication: 2020-11-18 13:20:03 UTC
-* Number of recursive dependencies: 47
+* Version: 1.0.7
+* GitHub: https://github.com/marjoleinF/pre
+* Source code: https://github.com/cran/pre
+* Date/Publication: 2024-01-12 19:30:02 UTC
+* Number of recursive dependencies: 151
-Run `revdepcheck::cloud_details(, "pssmooth")` for more info
+Run `revdepcheck::cloud_details(, "pre")` for more info
## In both
-* checking whether package ‘pssmooth’ can be installed ... ERROR
+* checking whether package ‘pre’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/pssmooth/new/pssmooth.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/pre/new/pre.Rcheck/00install.out’ for details.
```
## Installation
@@ -7413,60 +8713,54 @@ Run `revdepcheck::cloud_details(, "pssmooth")` for more info
### Devel
```
-* installing *source* package ‘pssmooth’ ...
-** package ‘pssmooth’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘pre’ ...
+** package ‘pre’ successfully unpacked and MD5 sums checked
** using staged installation
** R
+** data
+*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Warning in check_dep_version() :
- ABI version mismatch:
-lme4 was built with Matrix ABI version 1
-Current Matrix ABI version is 0
-Please re-install lme4 from source or restore original ‘Matrix’ package
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘pssmooth’
-* removing ‘/tmp/workdir/pssmooth/new/pssmooth.Rcheck/pssmooth’
+ERROR: lazy loading failed for package ‘pre’
+* removing ‘/tmp/workdir/pre/new/pre.Rcheck/pre’
```
### CRAN
```
-* installing *source* package ‘pssmooth’ ...
-** package ‘pssmooth’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘pre’ ...
+** package ‘pre’ successfully unpacked and MD5 sums checked
** using staged installation
** R
+** data
+*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Warning in check_dep_version() :
- ABI version mismatch:
-lme4 was built with Matrix ABI version 1
-Current Matrix ABI version is 0
-Please re-install lme4 from source or restore original ‘Matrix’ package
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘pssmooth’
-* removing ‘/tmp/workdir/pssmooth/old/pssmooth.Rcheck/pssmooth’
+ERROR: lazy loading failed for package ‘pre’
+* removing ‘/tmp/workdir/pre/old/pre.Rcheck/pre’
```
-# ptmixed
+# ProFAST
-* Version: 1.1.3
-* GitHub: NA
-* Source code: https://github.com/cran/ptmixed
-* Date/Publication: 2022-08-18 12:00:02 UTC
-* Number of recursive dependencies: 55
+* Version: 1.4
+* GitHub: https://github.com/feiyoung/ProFAST
+* Source code: https://github.com/cran/ProFAST
+* Date/Publication: 2024-03-18 08:10:06 UTC
+* Number of recursive dependencies: 245
-Run `revdepcheck::cloud_details(, "ptmixed")` for more info
+Run `revdepcheck::cloud_details(, "ProFAST")` for more info
@@ -7475,7 +8769,7 @@ Run `revdepcheck::cloud_details(, "ptmixed")` for more info
### Devel
```
-* using log directory ‘/tmp/workdir/ptmixed/new/ptmixed.Rcheck’
+* using log directory ‘/tmp/workdir/ProFAST/new/ProFAST.Rcheck’
* using R version 4.3.1 (2023-06-16)
* using platform: x86_64-pc-linux-gnu (64-bit)
* R was compiled by
@@ -7484,13 +8778,13 @@ Run `revdepcheck::cloud_details(, "ptmixed")` for more info
* running under: Ubuntu 22.04.4 LTS
* using session charset: UTF-8
* using option ‘--no-manual’
-* checking for file ‘ptmixed/DESCRIPTION’ ... OK
+* checking for file ‘ProFAST/DESCRIPTION’ ... OK
...
-* this is package ‘ptmixed’ version ‘1.1.3’
+* this is package ‘ProFAST’ version ‘1.4’
* package encoding: UTF-8
* checking package namespace information ... OK
* checking package dependencies ... ERROR
-Package required but not available: ‘tweeDEseq’
+Packages required but not available: 'DR.SC', 'PRECAST'
See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
manual.
@@ -7505,7 +8799,7 @@ Status: 1 ERROR
### CRAN
```
-* using log directory ‘/tmp/workdir/ptmixed/old/ptmixed.Rcheck’
+* using log directory ‘/tmp/workdir/ProFAST/old/ProFAST.Rcheck’
* using R version 4.3.1 (2023-06-16)
* using platform: x86_64-pc-linux-gnu (64-bit)
* R was compiled by
@@ -7514,13 +8808,13 @@ Status: 1 ERROR
* running under: Ubuntu 22.04.4 LTS
* using session charset: UTF-8
* using option ‘--no-manual’
-* checking for file ‘ptmixed/DESCRIPTION’ ... OK
+* checking for file ‘ProFAST/DESCRIPTION’ ... OK
...
-* this is package ‘ptmixed’ version ‘1.1.3’
+* this is package ‘ProFAST’ version ‘1.4’
* package encoding: UTF-8
* checking package namespace information ... OK
* checking package dependencies ... ERROR
-Package required but not available: ‘tweeDEseq’
+Packages required but not available: 'DR.SC', 'PRECAST'
See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
manual.
@@ -7532,26 +8826,26 @@ Status: 1 ERROR
```
-# QHScrnomo
+# PRSPGx
-* Version: 3.0.1
-* GitHub: https://github.com/ClevelandClinicQHS/QHScrnomo
-* Source code: https://github.com/cran/QHScrnomo
-* Date/Publication: 2024-03-18 21:20:02 UTC
-* Number of recursive dependencies: 92
+* Version: 0.3.0
+* GitHub: NA
+* Source code: https://github.com/cran/PRSPGx
+* Date/Publication: 2022-07-20 15:00:02 UTC
+* Number of recursive dependencies: 109
-Run `revdepcheck::cloud_details(, "QHScrnomo")` for more info
+Run `revdepcheck::cloud_details(, "PRSPGx")` for more info
## In both
-* checking whether package ‘QHScrnomo’ can be installed ... ERROR
+* checking whether package ‘PRSPGx’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/QHScrnomo/new/QHScrnomo.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/PRSPGx/new/PRSPGx.Rcheck/00install.out’ for details.
```
## Installation
@@ -7559,71 +8853,63 @@ Run `revdepcheck::cloud_details(, "QHScrnomo")` for more info
### Devel
```
-* installing *source* package ‘QHScrnomo’ ...
-** package ‘QHScrnomo’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘PRSPGx’ ...
+** package ‘PRSPGx’ successfully unpacked and MD5 sums checked
** using staged installation
-** libs
-using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c Cindex.c -o Cindex.o
-gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o QHScrnomo.so Cindex.o -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/QHScrnomo/new/QHScrnomo.Rcheck/00LOCK-QHScrnomo/00new/QHScrnomo/libs
** R
** data
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘rms’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘QHScrnomo’
-* removing ‘/tmp/workdir/QHScrnomo/new/QHScrnomo.Rcheck/QHScrnomo’
+ERROR: lazy loading failed for package ‘PRSPGx’
+* removing ‘/tmp/workdir/PRSPGx/new/PRSPGx.Rcheck/PRSPGx’
```
### CRAN
```
-* installing *source* package ‘QHScrnomo’ ...
-** package ‘QHScrnomo’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘PRSPGx’ ...
+** package ‘PRSPGx’ successfully unpacked and MD5 sums checked
** using staged installation
-** libs
-using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c Cindex.c -o Cindex.o
-gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o QHScrnomo.so Cindex.o -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/QHScrnomo/old/QHScrnomo.Rcheck/00LOCK-QHScrnomo/00new/QHScrnomo/libs
** R
** data
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘rms’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘QHScrnomo’
-* removing ‘/tmp/workdir/QHScrnomo/old/QHScrnomo.Rcheck/QHScrnomo’
+ERROR: lazy loading failed for package ‘PRSPGx’
+* removing ‘/tmp/workdir/PRSPGx/old/PRSPGx.Rcheck/PRSPGx’
```
-# qreport
+# psbcSpeedUp
-* Version: 1.0-1
-* GitHub: NA
-* Source code: https://github.com/cran/qreport
-* Date/Publication: 2024-05-26 21:50:03 UTC
-* Number of recursive dependencies: 77
+* Version: 2.0.7
+* GitHub: https://github.com/ocbe-uio/psbcSpeedUp
+* Source code: https://github.com/cran/psbcSpeedUp
+* Date/Publication: 2024-07-01 09:00:02 UTC
+* Number of recursive dependencies: 130
-Run `revdepcheck::cloud_details(, "qreport")` for more info
+Run `revdepcheck::cloud_details(, "psbcSpeedUp")` for more info
## In both
-* checking whether package ‘qreport’ can be installed ... ERROR
+* checking whether package ‘psbcSpeedUp’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/qreport/new/qreport.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/psbcSpeedUp/new/psbcSpeedUp.Rcheck/00install.out’ for details.
```
## Installation
@@ -7631,34 +8917,272 @@ Run `revdepcheck::cloud_details(, "qreport")` for more info
### Devel
```
-* installing *source* package ‘qreport’ ...
-** package ‘qreport’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘psbcSpeedUp’ ...
+** package ‘psbcSpeedUp’ successfully unpacked and MD5 sums checked
** using staged installation
-** R
+checking whether the C++ compiler works... yes
+checking for C++ compiler default output file name... a.out
+checking for suffix of executables...
+checking whether we are cross compiling... no
+checking for suffix of object files... o
+checking whether the compiler supports GNU C++... yes
+checking whether g++ -std=gnu++17 accepts -g... yes
+...
+** data
+*** moving datasets to lazyload DB
+** inst
** byte-compile and prepare package for lazy loading
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+ there is no package called ‘rms’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
+Execution halted
+ERROR: lazy loading failed for package ‘psbcSpeedUp’
+* removing ‘/tmp/workdir/psbcSpeedUp/new/psbcSpeedUp.Rcheck/psbcSpeedUp’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘psbcSpeedUp’ ...
+** package ‘psbcSpeedUp’ successfully unpacked and MD5 sums checked
+** using staged installation
+checking whether the C++ compiler works... yes
+checking for C++ compiler default output file name... a.out
+checking for suffix of executables...
+checking whether we are cross compiling... no
+checking for suffix of object files... o
+checking whether the compiler supports GNU C++... yes
+checking whether g++ -std=gnu++17 accepts -g... yes
+...
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ there is no package called ‘rms’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
+Execution halted
+ERROR: lazy loading failed for package ‘psbcSpeedUp’
+* removing ‘/tmp/workdir/psbcSpeedUp/old/psbcSpeedUp.Rcheck/psbcSpeedUp’
+
+
+```
+# pscore
+
+
+
+* Version: 0.4.0
+* GitHub: https://github.com/JWiley/score-project
+* Source code: https://github.com/cran/pscore
+* Date/Publication: 2022-05-13 22:30:02 UTC
+* Number of recursive dependencies: 169
+
+Run `revdepcheck::cloud_details(, "pscore")` for more info
+
+
+
+## In both
+
+* checking whether package ‘pscore’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/pscore/new/pscore.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘pscore’ ...
+** package ‘pscore’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+** inst
+** byte-compile and prepare package for lazy loading
+Warning in check_dep_version() :
+ ABI version mismatch:
+lme4 was built with Matrix ABI version 1
+Current Matrix ABI version is 0
+Please re-install lme4 from source or restore original ‘Matrix’ package
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘pscore’
+* removing ‘/tmp/workdir/pscore/new/pscore.Rcheck/pscore’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘pscore’ ...
+** package ‘pscore’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+** inst
+** byte-compile and prepare package for lazy loading
+Warning in check_dep_version() :
+ ABI version mismatch:
+lme4 was built with Matrix ABI version 1
+Current Matrix ABI version is 0
+Please re-install lme4 from source or restore original ‘Matrix’ package
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘pscore’
+* removing ‘/tmp/workdir/pscore/old/pscore.Rcheck/pscore’
+
+
+```
+# pssmooth
+
+
+
+* Version: 1.0.3
+* GitHub: https://github.com/mjuraska/pssmooth
+* Source code: https://github.com/cran/pssmooth
+* Date/Publication: 2020-11-18 13:20:03 UTC
+* Number of recursive dependencies: 47
+
+Run `revdepcheck::cloud_details(, "pssmooth")` for more info
+
+
+
+## In both
+
+* checking whether package ‘pssmooth’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/pssmooth/new/pssmooth.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘pssmooth’ ...
+** package ‘pssmooth’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Warning in check_dep_version() :
+ ABI version mismatch:
+lme4 was built with Matrix ABI version 1
+Current Matrix ABI version is 0
+Please re-install lme4 from source or restore original ‘Matrix’ package
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘qreport’
-* removing ‘/tmp/workdir/qreport/new/qreport.Rcheck/qreport’
+ERROR: lazy loading failed for package ‘pssmooth’
+* removing ‘/tmp/workdir/pssmooth/new/pssmooth.Rcheck/pssmooth’
```
### CRAN
```
-* installing *source* package ‘qreport’ ...
-** package ‘qreport’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘pssmooth’ ...
+** package ‘pssmooth’ successfully unpacked and MD5 sums checked
** using staged installation
** R
+** inst
** byte-compile and prepare package for lazy loading
+Warning in check_dep_version() :
+ ABI version mismatch:
+lme4 was built with Matrix ABI version 1
+Current Matrix ABI version is 0
+Please re-install lme4 from source or restore original ‘Matrix’ package
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘qreport’
-* removing ‘/tmp/workdir/qreport/old/qreport.Rcheck/qreport’
+ERROR: lazy loading failed for package ‘pssmooth’
+* removing ‘/tmp/workdir/pssmooth/old/pssmooth.Rcheck/pssmooth’
+
+
+```
+# ptmixed
+
+
+
+* Version: 1.1.3
+* GitHub: NA
+* Source code: https://github.com/cran/ptmixed
+* Date/Publication: 2022-08-18 12:00:02 UTC
+* Number of recursive dependencies: 55
+
+Run `revdepcheck::cloud_details(, "ptmixed")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/ptmixed/new/ptmixed.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘ptmixed/DESCRIPTION’ ... OK
+...
+* this is package ‘ptmixed’ version ‘1.1.3’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘tweeDEseq’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/ptmixed/old/ptmixed.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘ptmixed/DESCRIPTION’ ... OK
+...
+* this is package ‘ptmixed’ version ‘1.1.3’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘tweeDEseq’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
@@ -7807,7 +9331,7 @@ ERROR: lazy loading failed for package ‘Qtools’
* Version: NA
* GitHub: NA
* Source code: https://github.com/cran/QuantileGH
-* Number of recursive dependencies: 99
+* Number of recursive dependencies: 98
Run `revdepcheck::cloud_details(, "QuantileGH")` for more info
@@ -7835,26 +9359,26 @@ Run `revdepcheck::cloud_details(, "QuantileGH")` for more info
```
-# quantregGrowth
+# quantilogram
-* Version: 1.7-1
+* Version: 3.1.1
* GitHub: NA
-* Source code: https://github.com/cran/quantregGrowth
-* Date/Publication: 2024-05-20 09:10:02 UTC
-* Number of recursive dependencies: 37
+* Source code: https://github.com/cran/quantilogram
+* Date/Publication: 2024-08-27 12:40:02 UTC
+* Number of recursive dependencies: 58
-Run `revdepcheck::cloud_details(, "quantregGrowth")` for more info
+Run `revdepcheck::cloud_details(, "quantilogram")` for more info
## In both
-* checking whether package ‘quantregGrowth’ can be installed ... ERROR
+* checking whether package ‘quantilogram’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/quantregGrowth/new/quantregGrowth.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/quantilogram/new/quantilogram.Rcheck/00install.out’ for details.
```
## Installation
@@ -7862,26 +9386,88 @@ Run `revdepcheck::cloud_details(, "quantregGrowth")` for more info
### Devel
```
-* installing *source* package ‘quantregGrowth’ ...
-** package ‘quantregGrowth’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘quantilogram’ ...
+** package ‘quantilogram’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
-** inst
+*** moving datasets to lazyload DB
** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘quantreg’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
Execution halted
-ERROR: lazy loading failed for package ‘quantregGrowth’
-* removing ‘/tmp/workdir/quantregGrowth/new/quantregGrowth.Rcheck/quantregGrowth’
+ERROR: lazy loading failed for package ‘quantilogram’
+* removing ‘/tmp/workdir/quantilogram/new/quantilogram.Rcheck/quantilogram’
```
### CRAN
```
-* installing *source* package ‘quantregGrowth’ ...
-** package ‘quantregGrowth’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘quantilogram’ ...
+** package ‘quantilogram’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘quantilogram’
+* removing ‘/tmp/workdir/quantilogram/old/quantilogram.Rcheck/quantilogram’
+
+
+```
+# quantregGrowth
+
+
+
+* Version: 1.7-1
+* GitHub: NA
+* Source code: https://github.com/cran/quantregGrowth
+* Date/Publication: 2024-05-20 09:10:02 UTC
+* Number of recursive dependencies: 37
+
+Run `revdepcheck::cloud_details(, "quantregGrowth")` for more info
+
+
+
+## In both
+
+* checking whether package ‘quantregGrowth’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/quantregGrowth/new/quantregGrowth.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘quantregGrowth’ ...
+** package ‘quantregGrowth’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+** inst
+** byte-compile and prepare package for lazy loading
+Error: package or namespace load failed for ‘quantreg’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Execution halted
+ERROR: lazy loading failed for package ‘quantregGrowth’
+* removing ‘/tmp/workdir/quantregGrowth/new/quantregGrowth.Rcheck/quantregGrowth’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘quantregGrowth’ ...
+** package ‘quantregGrowth’ successfully unpacked and MD5 sums checked
** using staged installation
** R
** data
@@ -8087,10 +9673,10 @@ ERROR: lazy loading failed for package ‘rddtools’
-* Version: 0.2.8
+* Version: 0.2.9
* GitHub: https://github.com/ropensci/rdflib
* Source code: https://github.com/cran/rdflib
-* Date/Publication: 2023-12-19 12:10:02 UTC
+* Date/Publication: 2024-08-17 06:00:05 UTC
* Number of recursive dependencies: 94
Run `revdepcheck::cloud_details(, "rdflib")` for more info
@@ -8215,228 +9801,467 @@ ERROR: configuration failed for package ‘redland’
```
-# rms
+# revert
-* Version: 6.8-1
-* GitHub: https://github.com/harrelfe/rms
-* Source code: https://github.com/cran/rms
-* Date/Publication: 2024-05-27 12:00:02 UTC
-* Number of recursive dependencies: 145
+* Version: 0.0.1
+* GitHub: NA
+* Source code: https://github.com/cran/revert
+* Date/Publication: 2023-11-23 16:20:05 UTC
+* Number of recursive dependencies: 73
-Run `revdepcheck::cloud_details(, "rms")` for more info
+Run `revdepcheck::cloud_details(, "revert")` for more info
-## In both
-
-* checking whether package ‘rms’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/rms/new/rms.Rcheck/00install.out’ for details.
- ```
-
-* checking package dependencies ... NOTE
- ```
- Package suggested but not available for checking: ‘rmsb’
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘rms’ ...
-** package ‘rms’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using Fortran compiler: ‘GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c init.c -o init.o
-gfortran -fpic -g -O2 -c lrmfit.f -o lrmfit.o
-gfortran -fpic -g -O2 -c mlmats.f -o mlmats.o
-gfortran -fpic -g -O2 -c ormuv.f -o ormuv.o
+* using log directory ‘/tmp/workdir/revert/new/revert.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘revert/DESCRIPTION’ ... OK
...
-** R
-** demo
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘rms’
-* removing ‘/tmp/workdir/rms/new/rms.Rcheck/rms’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available:
+ 'BSgenome', 'BSgenome.Hsapiens.UCSC.hg38'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘rms’ ...
-** package ‘rms’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using Fortran compiler: ‘GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fpic -g -O2 -c init.c -o init.o
-gfortran -fpic -g -O2 -c lrmfit.f -o lrmfit.o
-gfortran -fpic -g -O2 -c mlmats.f -o mlmats.o
-gfortran -fpic -g -O2 -c ormuv.f -o ormuv.o
+* using log directory ‘/tmp/workdir/revert/old/revert.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘revert/DESCRIPTION’ ... OK
...
-** R
-** demo
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘rms’
-* removing ‘/tmp/workdir/rms/old/rms.Rcheck/rms’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available:
+ 'BSgenome', 'BSgenome.Hsapiens.UCSC.hg38'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
-# rmsb
+# RFLPtools
-* Version: 1.1-1
+* Version: 2.0
* GitHub: NA
-* Source code: https://github.com/cran/rmsb
-* Date/Publication: 2024-07-08 11:10:03 UTC
-* Number of recursive dependencies: 135
+* Source code: https://github.com/cran/RFLPtools
+* Date/Publication: 2022-02-08 09:40:02 UTC
+* Number of recursive dependencies: 52
-Run `revdepcheck::cloud_details(, "rmsb")` for more info
+Run `revdepcheck::cloud_details(, "RFLPtools")` for more info
-## In both
-
-* checking whether package ‘rmsb’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/rmsb/new/rmsb.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘rmsb’ ...
-** package ‘rmsb’ successfully unpacked and MD5 sums checked
-** using staged installation
-Error in loadNamespace(x) : there is no package called ‘rstantools’
-Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
-Execution halted
-ERROR: configuration failed for package ‘rmsb’
-* removing ‘/tmp/workdir/rmsb/new/rmsb.Rcheck/rmsb’
-
+* using log directory ‘/tmp/workdir/RFLPtools/new/RFLPtools.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘RFLPtools/DESCRIPTION’ ... OK
+...
+--- failed re-building ‘RFLPtools.Rmd’
-```
-### CRAN
+SUMMARY: processing the following file failed:
+ ‘RFLPtools.Rmd’
-```
-* installing *source* package ‘rmsb’ ...
-** package ‘rmsb’ successfully unpacked and MD5 sums checked
-** using staged installation
-Error in loadNamespace(x) : there is no package called ‘rstantools’
-Calls: loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
+Error: Vignette re-building failed.
Execution halted
-ERROR: configuration failed for package ‘rmsb’
-* removing ‘/tmp/workdir/rmsb/old/rmsb.Rcheck/rmsb’
-
-
-```
-# robmed
-
+* DONE
+Status: 1 ERROR, 1 WARNING, 2 NOTEs
-* Version: 1.0.2
-* GitHub: https://github.com/aalfons/robmed
-* Source code: https://github.com/cran/robmed
-* Date/Publication: 2023-06-16 23:00:02 UTC
-* Number of recursive dependencies: 60
-Run `revdepcheck::cloud_details(, "robmed")` for more info
-
-## In both
-* checking whether package ‘robmed’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/robmed/new/robmed.Rcheck/00install.out’ for details.
- ```
+```
+### CRAN
-## Installation
+```
+* using log directory ‘/tmp/workdir/RFLPtools/old/RFLPtools.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘RFLPtools/DESCRIPTION’ ... OK
+...
+--- failed re-building ‘RFLPtools.Rmd’
-### Devel
+SUMMARY: processing the following file failed:
+ ‘RFLPtools.Rmd’
-```
-* installing *source* package ‘robmed’ ...
-** package ‘robmed’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Error: Vignette re-building failed.
Execution halted
-ERROR: lazy loading failed for package ‘robmed’
-* removing ‘/tmp/workdir/robmed/new/robmed.Rcheck/robmed’
+
+* DONE
+Status: 1 ERROR, 1 WARNING, 2 NOTEs
-```
-### CRAN
-```
-* installing *source* package ‘robmed’ ...
-** package ‘robmed’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘robmed’
-* removing ‘/tmp/workdir/robmed/old/robmed.Rcheck/robmed’
```
-# RPPASPACE
+# Rgff
-* Version: 1.0.10
-* GitHub: https://github.com/MD-Anderson-Bioinformatics/rppaspace
-* Source code: https://github.com/cran/RPPASPACE
-* Date/Publication: 2023-10-19 21:30:08 UTC
-* Number of recursive dependencies: 60
+* Version: 0.1.6
+* GitHub: NA
+* Source code: https://github.com/cran/Rgff
+* Date/Publication: 2022-09-30 10:40:02 UTC
+* Number of recursive dependencies: 113
-Run `revdepcheck::cloud_details(, "RPPASPACE")` for more info
+Run `revdepcheck::cloud_details(, "Rgff")` for more info
-## In both
-
-* checking whether package ‘RPPASPACE’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/RPPASPACE/new/RPPASPACE.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/Rgff/new/Rgff.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘Rgff/DESCRIPTION’ ... OK
+...
+--- failed re-building ‘Using_Rgff.Rmd’
+
+SUMMARY: processing the following file failed:
+ ‘Using_Rgff.Rmd’
+
+Error: Vignette re-building failed.
+Execution halted
+
+* DONE
+Status: 1 ERROR, 3 NOTEs
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/Rgff/old/Rgff.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘Rgff/DESCRIPTION’ ... OK
+...
+--- failed re-building ‘Using_Rgff.Rmd’
+
+SUMMARY: processing the following file failed:
+ ‘Using_Rgff.Rmd’
+
+Error: Vignette re-building failed.
+Execution halted
+
+* DONE
+Status: 1 ERROR, 3 NOTEs
+
+
+
+
+
+```
+# RGraphSpace
+
+
+
+* Version: NA
+* GitHub: NA
+* Source code: https://github.com/cran/RGraphSpace
+* Number of recursive dependencies: 65
+
+Run `revdepcheck::cloud_details(, "RGraphSpace")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+
+
+
+
+
+
+```
+### CRAN
+
+```
+
+
+
+
+
+
+```
+# rms
+
+
+
+* Version: NA
+* GitHub: NA
+* Source code: https://github.com/cran/rms
+* Number of recursive dependencies: 145
+
+Run `revdepcheck::cloud_details(, "rms")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+
+
+
+
+
+
+```
+### CRAN
+
+```
+
+
+
+
+
+
+```
+# RNAseqQC
+
+
+
+* Version: 0.2.1
+* GitHub: https://github.com/frederikziebell/RNAseqQC
+* Source code: https://github.com/cran/RNAseqQC
+* Date/Publication: 2024-07-15 14:40:02 UTC
+* Number of recursive dependencies: 162
+
+Run `revdepcheck::cloud_details(, "RNAseqQC")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/RNAseqQC/new/RNAseqQC.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘RNAseqQC/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'ensembldb', 'ComplexHeatmap'
+
+Package suggested but not available for checking: ‘recount3’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/RNAseqQC/old/RNAseqQC.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘RNAseqQC/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'ensembldb', 'ComplexHeatmap'
+
+Package suggested but not available for checking: ‘recount3’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# robmed
+
+
+
+* Version: 1.0.2
+* GitHub: https://github.com/aalfons/robmed
+* Source code: https://github.com/cran/robmed
+* Date/Publication: 2023-06-16 23:00:02 UTC
+* Number of recursive dependencies: 60
+
+Run `revdepcheck::cloud_details(, "robmed")` for more info
+
+
+
+## In both
+
+* checking whether package ‘robmed’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/robmed/new/robmed.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘robmed’ ...
+** package ‘robmed’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘robmed’
+* removing ‘/tmp/workdir/robmed/new/robmed.Rcheck/robmed’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘robmed’ ...
+** package ‘robmed’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘robmed’
+* removing ‘/tmp/workdir/robmed/old/robmed.Rcheck/robmed’
+
+
+```
+# RPPASPACE
+
+
+
+* Version: 1.0.10
+* GitHub: https://github.com/MD-Anderson-Bioinformatics/rppaspace
+* Source code: https://github.com/cran/RPPASPACE
+* Date/Publication: 2023-10-19 21:30:08 UTC
+* Number of recursive dependencies: 60
+
+Run `revdepcheck::cloud_details(, "RPPASPACE")` for more info
+
+
+
+## In both
+
+* checking whether package ‘RPPASPACE’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/RPPASPACE/new/RPPASPACE.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
### Devel
@@ -8458,106 +10283,365 @@ ERROR: lazy loading failed for package ‘RPPASPACE’
```
### CRAN
-```
-* installing *source* package ‘RPPASPACE’ ...
-** package ‘RPPASPACE’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘RPPASPACE’
-* removing ‘/tmp/workdir/RPPASPACE/old/RPPASPACE.Rcheck/RPPASPACE’
+```
+* installing *source* package ‘RPPASPACE’ ...
+** package ‘RPPASPACE’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘RPPASPACE’
+* removing ‘/tmp/workdir/RPPASPACE/old/RPPASPACE.Rcheck/RPPASPACE’
+
+
+```
+# RQdeltaCT
+
+
+
+* Version: 1.3.0
+* GitHub: NA
+* Source code: https://github.com/cran/RQdeltaCT
+* Date/Publication: 2024-04-17 15:50:02 UTC
+* Number of recursive dependencies: 166
+
+Run `revdepcheck::cloud_details(, "RQdeltaCT")` for more info
+
+
+
+## In both
+
+* checking whether package ‘RQdeltaCT’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/RQdeltaCT/new/RQdeltaCT.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘RQdeltaCT’ ...
+** package ‘RQdeltaCT’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘RQdeltaCT’
+* removing ‘/tmp/workdir/RQdeltaCT/new/RQdeltaCT.Rcheck/RQdeltaCT’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘RQdeltaCT’ ...
+** package ‘RQdeltaCT’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘RQdeltaCT’
+* removing ‘/tmp/workdir/RQdeltaCT/old/RQdeltaCT.Rcheck/RQdeltaCT’
+
+
+```
+# rqPen
+
+
+
+* Version: 4.1.1
+* GitHub: https://github.com/bssherwood/rqpen
+* Source code: https://github.com/cran/rqPen
+* Date/Publication: 2024-06-04 13:30:01 UTC
+* Number of recursive dependencies: 24
+
+Run `revdepcheck::cloud_details(, "rqPen")` for more info
+
+
+
+## In both
+
+* checking whether package ‘rqPen’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/rqPen/new/rqPen.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘rqPen’ ...
+** package ‘rqPen’ successfully unpacked and MD5 sums checked
+** using staged installation
+** libs
+using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c solvebetaRcpp.cpp -o solvebetaRcpp.o
+g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o rqPen.so RcppExports.o solvebetaRcpp.o -L/opt/R/4.3.1/lib/R/lib -lR
+installing to /tmp/workdir/rqPen/new/rqPen.Rcheck/00LOCK-rqPen/00new/rqPen/libs
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘rqPen’
+* removing ‘/tmp/workdir/rqPen/new/rqPen.Rcheck/rqPen’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘rqPen’ ...
+** package ‘rqPen’ successfully unpacked and MD5 sums checked
+** using staged installation
+** libs
+using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c solvebetaRcpp.cpp -o solvebetaRcpp.o
+g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o rqPen.so RcppExports.o solvebetaRcpp.o -L/opt/R/4.3.1/lib/R/lib -lR
+installing to /tmp/workdir/rqPen/old/rqPen.Rcheck/00LOCK-rqPen/00new/rqPen/libs
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘rqPen’
+* removing ‘/tmp/workdir/rqPen/old/rqPen.Rcheck/rqPen’
+
+
+```
+# Rraven
+
+
+
+* Version: 1.0.14
+* GitHub: https://github.com/maRce10/Rraven
+* Source code: https://github.com/cran/Rraven
+* Date/Publication: 2024-08-19 22:40:10 UTC
+* Number of recursive dependencies: 90
+
+Run `revdepcheck::cloud_details(, "Rraven")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/Rraven/new/Rraven.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘Rraven/DESCRIPTION’ ... OK
+...
+* checking extension type ... Package
+* this is package ‘Rraven’ version ‘1.0.14’
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘warbleR’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/Rraven/old/Rraven.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘Rraven/DESCRIPTION’ ... OK
+...
+* checking extension type ... Package
+* this is package ‘Rraven’ version ‘1.0.14’
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘warbleR’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# RRPP
+
+
+
+* Version: NA
+* GitHub: NA
+* Source code: https://github.com/cran/RRPP
+* Number of recursive dependencies: 68
+
+Run `revdepcheck::cloud_details(, "RRPP")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+
+
+
+
+
+
+```
+### CRAN
+
+```
+
+
+
+
```
-# RQdeltaCT
+# rsolr
-* Version: 1.3.0
+* Version: 0.0.13
* GitHub: NA
-* Source code: https://github.com/cran/RQdeltaCT
-* Date/Publication: 2024-04-17 15:50:02 UTC
-* Number of recursive dependencies: 165
+* Source code: https://github.com/cran/rsolr
+* Date/Publication: 2022-05-18 07:10:02 UTC
+* Number of recursive dependencies: 27
-Run `revdepcheck::cloud_details(, "RQdeltaCT")` for more info
+Run `revdepcheck::cloud_details(, "rsolr")` for more info
-## In both
-
-* checking whether package ‘RQdeltaCT’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/RQdeltaCT/new/RQdeltaCT.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘RQdeltaCT’ ...
-** package ‘RQdeltaCT’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘RQdeltaCT’
-* removing ‘/tmp/workdir/RQdeltaCT/new/RQdeltaCT.Rcheck/RQdeltaCT’
+* using log directory ‘/tmp/workdir/rsolr/new/rsolr.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘rsolr/DESCRIPTION’ ... OK
+...
+* checking extension type ... Package
+* this is package ‘rsolr’ version ‘0.0.13’
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'restfulr', 'rjson'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘RQdeltaCT’ ...
-** package ‘RQdeltaCT’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘RQdeltaCT’
-* removing ‘/tmp/workdir/RQdeltaCT/old/RQdeltaCT.Rcheck/RQdeltaCT’
+* using log directory ‘/tmp/workdir/rsolr/old/rsolr.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘rsolr/DESCRIPTION’ ... OK
+...
+* checking extension type ... Package
+* this is package ‘rsolr’ version ‘0.0.13’
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'restfulr', 'rjson'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
-# rqPen
+# rstanarm
-* Version: 4.1.1
-* GitHub: https://github.com/bssherwood/rqpen
-* Source code: https://github.com/cran/rqPen
-* Date/Publication: 2024-06-04 13:30:01 UTC
-* Number of recursive dependencies: 24
+* Version: 2.32.1
+* GitHub: https://github.com/stan-dev/rstanarm
+* Source code: https://github.com/cran/rstanarm
+* Date/Publication: 2024-01-18 23:00:03 UTC
+* Number of recursive dependencies: 138
-Run `revdepcheck::cloud_details(, "rqPen")` for more info
+Run `revdepcheck::cloud_details(, "rstanarm")` for more info
## In both
-* checking whether package ‘rqPen’ can be installed ... ERROR
+* checking whether package ‘rstanarm’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/rqPen/new/rqPen.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/00install.out’ for details.
```
## Installation
@@ -8565,61 +10649,68 @@ Run `revdepcheck::cloud_details(, "rqPen")` for more info
### Devel
```
-* installing *source* package ‘rqPen’ ...
-** package ‘rqPen’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘rstanarm’ ...
+** package ‘rstanarm’ successfully unpacked and MD5 sums checked
** using staged installation
** libs
using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c solvebetaRcpp.cpp -o solvebetaRcpp.o
-g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o rqPen.so RcppExports.o solvebetaRcpp.o -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/rqPen/new/rqPen.Rcheck/00LOCK-rqPen/00new/rqPen/libs
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘rqPen’
-* removing ‘/tmp/workdir/rqPen/new/rqPen.Rcheck/rqPen’
+using C++17
+"/opt/R/4.3.1/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan
+Wrote C++ file "stan_files/bernoulli.cc"
+
+
+...
+/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:16: required from here
+/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes]
+ 654 | return internal::first_aligned::alignment),Derived>(m);
+ | ^~~~~~~~~
+g++: fatal error: Killed signal terminated program cc1plus
+compilation terminated.
+make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stan_files/continuous.o] Error 1
+rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc
+ERROR: compilation failed for package ‘rstanarm’
+* removing ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/rstanarm’
```
### CRAN
```
-* installing *source* package ‘rqPen’ ...
-** package ‘rqPen’ successfully unpacked and MD5 sums checked
+* installing *source* package ‘rstanarm’ ...
+** package ‘rstanarm’ successfully unpacked and MD5 sums checked
** using staged installation
** libs
using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
-g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I'/opt/R/4.3.1/lib/R/site-library/RcppArmadillo/include' -I/usr/local/include -fpic -g -O2 -c solvebetaRcpp.cpp -o solvebetaRcpp.o
-g++ -std=gnu++17 -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o rqPen.so RcppExports.o solvebetaRcpp.o -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/rqPen/old/rqPen.Rcheck/00LOCK-rqPen/00new/rqPen/libs
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘rqPen’
-* removing ‘/tmp/workdir/rqPen/old/rqPen.Rcheck/rqPen’
+using C++17
+"/opt/R/4.3.1/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan
+Wrote C++ file "stan_files/bernoulli.cc"
+
+
+...
+/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/stan/math/rev/fun/quad_form.hpp:88:16: required from here
+/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes]
+ 654 | return internal::first_aligned::alignment),Derived>(m);
+ | ^~~~~~~~~
+g++: fatal error: Killed signal terminated program cc1plus
+compilation terminated.
+make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stan_files/continuous.o] Error 1
+rm stan_files/bernoulli.cc stan_files/binomial.cc stan_files/continuous.cc
+ERROR: compilation failed for package ‘rstanarm’
+* removing ‘/tmp/workdir/rstanarm/old/rstanarm.Rcheck/rstanarm’
```
-# RRPP
+# RTIGER
-* Version: NA
+* Version: 2.1.0
* GitHub: NA
-* Source code: https://github.com/cran/RRPP
-* Number of recursive dependencies: 68
+* Source code: https://github.com/cran/RTIGER
+* Date/Publication: 2023-03-29 09:20:02 UTC
+* Number of recursive dependencies: 160
-Run `revdepcheck::cloud_details(, "RRPP")` for more info
+Run `revdepcheck::cloud_details(, "RTIGER")` for more info
@@ -8628,7 +10719,27 @@ Run `revdepcheck::cloud_details(, "RRPP")` for more info
### Devel
```
-
+* using log directory ‘/tmp/workdir/RTIGER/new/RTIGER.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘RTIGER/DESCRIPTION’ ... OK
+...
+* checking installed files from ‘inst/doc’ ... OK
+* checking files in ‘vignettes’ ... OK
+* checking examples ... OK
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘tutorial_RTIGER.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
@@ -8638,88 +10749,184 @@ Run `revdepcheck::cloud_details(, "RRPP")` for more info
### CRAN
```
-
+* using log directory ‘/tmp/workdir/RTIGER/old/RTIGER.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘RTIGER/DESCRIPTION’ ... OK
+...
+* checking installed files from ‘inst/doc’ ... OK
+* checking files in ‘vignettes’ ... OK
+* checking examples ... OK
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘tutorial_RTIGER.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
```
-# rstanarm
+# rTwig
-* Version: 2.32.1
-* GitHub: https://github.com/stan-dev/rstanarm
-* Source code: https://github.com/cran/rstanarm
-* Date/Publication: 2024-01-18 23:00:03 UTC
-* Number of recursive dependencies: 138
+* Version: 1.1.0
+* GitHub: https://github.com/aidanmorales/rTwig
+* Source code: https://github.com/cran/rTwig
+* Date/Publication: 2024-08-21 00:50:02 UTC
+* Number of recursive dependencies: 147
-Run `revdepcheck::cloud_details(, "rstanarm")` for more info
+Run `revdepcheck::cloud_details(, "rTwig")` for more info
## In both
-* checking whether package ‘rstanarm’ can be installed ... ERROR
+* checking whether package ‘rTwig’ can be installed ... ERROR
```
Installation failed.
- See ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/00install.out’ for details.
+ See ‘/tmp/workdir/rTwig/new/rTwig.Rcheck/00install.out’ for details.
```
-## Installation
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘rTwig’ ...
+** package ‘rTwig’ successfully unpacked and MD5 sums checked
+** using staged installation
+** libs
+using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c box_counting.cpp -o box_counting.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c colors.cpp -o colors.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c convex_hull.cpp -o convex_hull.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c cylinder_mesh.cpp -o cylinder_mesh.o
+...
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘rTwig’
+* removing ‘/tmp/workdir/rTwig/new/rTwig.Rcheck/rTwig’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘rTwig’ ...
+** package ‘rTwig’ successfully unpacked and MD5 sums checked
+** using staged installation
+** libs
+using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c RcppExports.cpp -o RcppExports.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c box_counting.cpp -o box_counting.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c colors.cpp -o colors.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c convex_hull.cpp -o convex_hull.o
+g++ -std=gnu++17 -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I'/opt/R/4.3.1/lib/R/site-library/Rcpp/include' -I/usr/local/include -fpic -g -O2 -c cylinder_mesh.cpp -o cylinder_mesh.o
+...
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘rTwig’
+* removing ‘/tmp/workdir/rTwig/old/rTwig.Rcheck/rTwig’
+
+
+```
+# RVA
+
+
+
+* Version: 0.0.5
+* GitHub: https://github.com/THERMOSTATS/RVA
+* Source code: https://github.com/cran/RVA
+* Date/Publication: 2021-11-01 21:40:02 UTC
+* Number of recursive dependencies: 207
+
+Run `revdepcheck::cloud_details(, "RVA")` for more info
+
+
+
+## Error before installation
### Devel
```
-* installing *source* package ‘rstanarm’ ...
-** package ‘rstanarm’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using C++17
-"/opt/R/4.3.1/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan
-Wrote C++ file "stan_files/bernoulli.cc"
+* using log directory ‘/tmp/workdir/RVA/new/RVA.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘RVA/DESCRIPTION’ ... OK
+...
+* this is package ‘RVA’ version ‘0.0.5’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'ComplexHeatmap', 'rWikiPathways'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
-...
-/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here
-/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes]
- 654 | return internal::first_aligned::alignment),Derived>(m);
- | ^~~~~~~~~
-g++: fatal error: Killed signal terminated program cc1plus
-compilation terminated.
-make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stan_files/bernoulli.o] Error 1
-rm stan_files/bernoulli.cc
-ERROR: compilation failed for package ‘rstanarm’
-* removing ‘/tmp/workdir/rstanarm/new/rstanarm.Rcheck/rstanarm’
```
### CRAN
```
-* installing *source* package ‘rstanarm’ ...
-** package ‘rstanarm’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C++ compiler: ‘g++ (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-using C++17
-"/opt/R/4.3.1/lib/R/bin/Rscript" -e "source(file.path('..', 'tools', 'make_cc.R')); make_cc(commandArgs(TRUE))" stan_files/bernoulli.stan
-Wrote C++ file "stan_files/bernoulli.cc"
+* using log directory ‘/tmp/workdir/RVA/old/RVA.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘RVA/DESCRIPTION’ ... OK
+...
+* this is package ‘RVA’ version ‘0.0.5’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'ComplexHeatmap', 'rWikiPathways'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
-...
-/opt/R/4.3.1/lib/R/site-library/StanHeaders/include/src/stan/mcmc/hmc/hamiltonians/dense_e_metric.hpp:21:10: required from here
-/opt/R/4.3.1/lib/R/site-library/RcppEigen/include/Eigen/src/Core/DenseCoeffsBase.h:654:74: warning: ignoring attributes on template argument ‘Eigen::internal::packet_traits::type’ {aka ‘__m128d’} [-Wignored-attributes]
- 654 | return internal::first_aligned::alignment),Derived>(m);
- | ^~~~~~~~~
-g++: fatal error: Killed signal terminated program cc1plus
-compilation terminated.
-make: *** [/opt/R/4.3.1/lib/R/etc/Makeconf:198: stan_files/bernoulli.o] Error 1
-rm stan_files/bernoulli.cc
-ERROR: compilation failed for package ‘rstanarm’
-* removing ‘/tmp/workdir/rstanarm/old/rstanarm.Rcheck/rstanarm’
```
@@ -8861,54 +11068,65 @@ Run `revdepcheck::cloud_details(, "scCustomize")` for more info
-## In both
+## Error before installation
-* checking whether package ‘scCustomize’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/scCustomize/new/scCustomize.Rcheck/00install.out’ for details.
- ```
+### Devel
-* checking package dependencies ... NOTE
- ```
- Package suggested but not available for checking: ‘Nebulosa’
- ```
+```
+* using log directory ‘/tmp/workdir/scCustomize/new/scCustomize.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘scCustomize/DESCRIPTION’ ... OK
+...
+* checking if there is a namespace ... OK
+* checking for executable files ... OK
+* checking for hidden files and directories ... OK
+* checking for portable file names ... OK
+* checking for sufficient/correct file permissions ... OK
+* checking whether package ‘scCustomize’ can be installed ... ERROR
+Installation failed.
+See ‘/tmp/workdir/scCustomize/new/scCustomize.Rcheck/00install.out’ for details.
+* DONE
+Status: 1 ERROR, 1 NOTE
-## Installation
-### Devel
-```
-* installing *source* package ‘scCustomize’ ...
-** package ‘scCustomize’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required
-Execution halted
-ERROR: lazy loading failed for package ‘scCustomize’
-* removing ‘/tmp/workdir/scCustomize/new/scCustomize.Rcheck/scCustomize’
```
### CRAN
```
-* installing *source* package ‘scCustomize’ ...
-** package ‘scCustomize’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘SeuratObject’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- namespace ‘Matrix’ 1.5-4.1 is being loaded, but >= 1.6.4 is required
-Execution halted
-ERROR: lazy loading failed for package ‘scCustomize’
-* removing ‘/tmp/workdir/scCustomize/old/scCustomize.Rcheck/scCustomize’
+* using log directory ‘/tmp/workdir/scCustomize/old/scCustomize.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘scCustomize/DESCRIPTION’ ... OK
+...
+* checking if there is a namespace ... OK
+* checking for executable files ... OK
+* checking for hidden files and directories ... OK
+* checking for portable file names ... OK
+* checking for sufficient/correct file permissions ... OK
+* checking whether package ‘scCustomize’ can be installed ... ERROR
+Installation failed.
+See ‘/tmp/workdir/scCustomize/old/scCustomize.Rcheck/00install.out’ for details.
+* DONE
+Status: 1 ERROR, 1 NOTE
+
+
+
```
@@ -9183,6 +11401,82 @@ ERROR: lazy loading failed for package ‘SCIntRuler’
* removing ‘/tmp/workdir/SCIntRuler/old/SCIntRuler.Rcheck/SCIntRuler’
+```
+# scITD
+
+
+
+* Version: 1.0.4
+* GitHub: NA
+* Source code: https://github.com/cran/scITD
+* Date/Publication: 2023-09-08 16:00:02 UTC
+* Number of recursive dependencies: 233
+
+Run `revdepcheck::cloud_details(, "scITD")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/scITD/new/scITD.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘scITD/DESCRIPTION’ ... OK
+...
+* checking package dependencies ... ERROR
+Package required but not available: ‘ComplexHeatmap’
+
+Packages suggested but not available for checking:
+ 'simplifyEnrichment', 'conos', 'pagoda2'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/scITD/old/scITD.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘scITD/DESCRIPTION’ ... OK
+...
+* checking package dependencies ... ERROR
+Package required but not available: ‘ComplexHeatmap’
+
+Packages suggested but not available for checking:
+ 'simplifyEnrichment', 'conos', 'pagoda2'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
```
# scMappR
@@ -9353,22 +11647,98 @@ ERROR: lazy loading failed for package ‘SeBR’
* removing ‘/tmp/workdir/SeBR/new/SeBR.Rcheck/SeBR’
-```
-### CRAN
+```
+### CRAN
+
+```
+* installing *source* package ‘SeBR’ ...
+** package ‘SeBR’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘SeBR’
+* removing ‘/tmp/workdir/SeBR/old/SeBR.Rcheck/SeBR’
+
+
+```
+# SeedMatchR
+
+
+
+* Version: 1.1.1
+* GitHub: NA
+* Source code: https://github.com/cran/SeedMatchR
+* Date/Publication: 2023-10-24 20:30:02 UTC
+* Number of recursive dependencies: 167
+
+Run `revdepcheck::cloud_details(, "SeedMatchR")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/SeedMatchR/new/SeedMatchR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘SeedMatchR/DESCRIPTION’ ... OK
+...
+* this is package ‘SeedMatchR’ version ‘1.1.1’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'msa', 'GenomicFeatures'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/SeedMatchR/old/SeedMatchR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘SeedMatchR/DESCRIPTION’ ... OK
+...
+* this is package ‘SeedMatchR’ version ‘1.1.1’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'msa', 'GenomicFeatures'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
-```
-* installing *source* package ‘SeBR’ ...
-** package ‘SeBR’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘SeBR’
-* removing ‘/tmp/workdir/SeBR/old/SeBR.Rcheck/SeBR’
```
@@ -9554,67 +11924,79 @@ ERROR: lazy loading failed for package ‘shinyTempSignal’
```
-# shrink
+# sigminer
-* Version: 1.2.3
-* GitHub: https://github.com/biometrician/shrink
-* Source code: https://github.com/cran/shrink
-* Date/Publication: 2023-10-31 12:30:02 UTC
-* Number of recursive dependencies: 80
+* Version: 2.3.1
+* GitHub: https://github.com/ShixiangWang/sigminer
+* Source code: https://github.com/cran/sigminer
+* Date/Publication: 2024-05-11 08:50:02 UTC
+* Number of recursive dependencies: 209
-Run `revdepcheck::cloud_details(, "shrink")` for more info
+Run `revdepcheck::cloud_details(, "sigminer")` for more info
-## In both
-
-* checking whether package ‘shrink’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/shrink/new/shrink.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘shrink’ ...
-** package ‘shrink’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘shrink’
-* removing ‘/tmp/workdir/shrink/new/shrink.Rcheck/shrink’
+* using log directory ‘/tmp/workdir/sigminer/new/sigminer.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘sigminer/DESCRIPTION’ ... OK
+...
+* checking files in ‘vignettes’ ... OK
+* checking examples ... OK
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘cnsignature.Rmd’ using ‘UTF-8’... OK
+ ‘sigminer.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 2 NOTEs
+
+
+
```
### CRAN
```
-* installing *source* package ‘shrink’ ...
-** package ‘shrink’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘shrink’
-* removing ‘/tmp/workdir/shrink/old/shrink.Rcheck/shrink’
+* using log directory ‘/tmp/workdir/sigminer/old/sigminer.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘sigminer/DESCRIPTION’ ... OK
+...
+* checking files in ‘vignettes’ ... OK
+* checking examples ... OK
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘cnsignature.Rmd’ using ‘UTF-8’... OK
+ ‘sigminer.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 2 NOTEs
+
+
+
```
@@ -9770,51 +12152,65 @@ Run `revdepcheck::cloud_details(, "SNPassoc")` for more info
-## In both
-
-* checking whether package ‘SNPassoc’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/SNPassoc/new/SNPassoc.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘SNPassoc’ ...
-** package ‘SNPassoc’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘SNPassoc’
-* removing ‘/tmp/workdir/SNPassoc/new/SNPassoc.Rcheck/SNPassoc’
+* using log directory ‘/tmp/workdir/SNPassoc/new/SNPassoc.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘SNPassoc/DESCRIPTION’ ... OK
+...
+* checking if there is a namespace ... OK
+* checking for executable files ... OK
+* checking for hidden files and directories ... OK
+* checking for portable file names ... OK
+* checking for sufficient/correct file permissions ... OK
+* checking whether package ‘SNPassoc’ can be installed ... ERROR
+Installation failed.
+See ‘/tmp/workdir/SNPassoc/new/SNPassoc.Rcheck/00install.out’ for details.
+* DONE
+Status: 1 ERROR, 1 NOTE
+
+
+
```
### CRAN
```
-* installing *source* package ‘SNPassoc’ ...
-** package ‘SNPassoc’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘SNPassoc’
-* removing ‘/tmp/workdir/SNPassoc/old/SNPassoc.Rcheck/SNPassoc’
+* using log directory ‘/tmp/workdir/SNPassoc/old/SNPassoc.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘SNPassoc/DESCRIPTION’ ... OK
+...
+* checking if there is a namespace ... OK
+* checking for executable files ... OK
+* checking for hidden files and directories ... OK
+* checking for portable file names ... OK
+* checking for sufficient/correct file permissions ... OK
+* checking whether package ‘SNPassoc’ can be installed ... ERROR
+Installation failed.
+See ‘/tmp/workdir/SNPassoc/old/SNPassoc.Rcheck/00install.out’ for details.
+* DONE
+Status: 1 ERROR, 1 NOTE
+
+
+
```
@@ -10044,45 +12440,197 @@ Run `revdepcheck::cloud_details(, "SoupX")` for more info
See ‘/tmp/workdir/SoupX/new/SoupX.Rcheck/00install.out’ for details.
```
-## Installation
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘SoupX’ ...
+** package ‘SoupX’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘SoupX’
+* removing ‘/tmp/workdir/SoupX/new/SoupX.Rcheck/SoupX’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘SoupX’ ...
+** package ‘SoupX’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘SoupX’
+* removing ‘/tmp/workdir/SoupX/old/SoupX.Rcheck/SoupX’
+
+
+```
+# SpatialDDLS
+
+
+
+* Version: 1.0.2
+* GitHub: https://github.com/diegommcc/SpatialDDLS
+* Source code: https://github.com/cran/SpatialDDLS
+* Date/Publication: 2024-04-26 16:10:02 UTC
+* Number of recursive dependencies: 207
+
+Run `revdepcheck::cloud_details(, "SpatialDDLS")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/SpatialDDLS/new/SpatialDDLS.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘SpatialDDLS/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘SpatialExperiment’
+
+Package suggested but not available for checking: ‘ComplexHeatmap’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/SpatialDDLS/old/SpatialDDLS.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘SpatialDDLS/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘SpatialExperiment’
+
+Package suggested but not available for checking: ‘ComplexHeatmap’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# speakeasyR
+
+
+
+* Version: 0.1.3
+* GitHub: https://github.com/SpeakEasy-2/speakeasyR
+* Source code: https://github.com/cran/speakeasyR
+* Date/Publication: 2024-08-20 09:40:06 UTC
+* Number of recursive dependencies: 138
+
+Run `revdepcheck::cloud_details(, "speakeasyR")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/speakeasyR/new/speakeasyR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘speakeasyR/DESCRIPTION’ ... OK
+...
+* checking for unstated dependencies in ‘tests’ ... OK
+* checking tests ... OK
+ Running ‘testthat.R’
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘speakeasyR.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
+
-### Devel
-```
-* installing *source* package ‘SoupX’ ...
-** package ‘SoupX’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘SoupX’
-* removing ‘/tmp/workdir/SoupX/new/SoupX.Rcheck/SoupX’
```
### CRAN
```
-* installing *source* package ‘SoupX’ ...
-** package ‘SoupX’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.4 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘SoupX’
-* removing ‘/tmp/workdir/SoupX/old/SoupX.Rcheck/SoupX’
+* using log directory ‘/tmp/workdir/speakeasyR/old/speakeasyR.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘speakeasyR/DESCRIPTION’ ... OK
+...
+* checking for unstated dependencies in ‘tests’ ... OK
+* checking tests ... OK
+ Running ‘testthat.R’
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘speakeasyR.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
+
+
+
```
@@ -10300,11 +12848,11 @@ ERROR: lazy loading failed for package ‘statsr’
-* Version: 0.6
-* GitHub: NA
+* Version: 0.7
+* GitHub: https://github.com/robjhyndman/stR
* Source code: https://github.com/cran/stR
-* Date/Publication: 2023-08-10 17:10:02 UTC
-* Number of recursive dependencies: 189
+* Date/Publication: 2024-07-28 13:30:01 UTC
+* Number of recursive dependencies: 191
Run `revdepcheck::cloud_details(, "stR")` for more info
@@ -10331,7 +12879,6 @@ Run `revdepcheck::cloud_details(, "stR")` for more info
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Warning: replacing previous import ‘Matrix::det’ by ‘SparseM::det’ when loading ‘stR’
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
@@ -10352,7 +12899,6 @@ ERROR: lazy loading failed for package ‘stR’
*** moving datasets to lazyload DB
** inst
** byte-compile and prepare package for lazy loading
-Warning: replacing previous import ‘Matrix::det’ by ‘SparseM::det’ when loading ‘stR’
Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.0 is required
Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
@@ -10405,38 +12951,262 @@ ERROR: lazy loading failed for package ‘STREAK’
* removing ‘/tmp/workdir/STREAK/new/STREAK.Rcheck/STREAK’
-```
-### CRAN
+```
+### CRAN
+
+```
+* installing *source* package ‘STREAK’ ...
+** package ‘STREAK’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
+ namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1.1 is required
+Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
+Execution halted
+ERROR: lazy loading failed for package ‘STREAK’
+* removing ‘/tmp/workdir/STREAK/old/STREAK.Rcheck/STREAK’
+
+
+```
+# streamDAG
+
+
+
+* Version: 1.5
+* GitHub: NA
+* Source code: https://github.com/cran/streamDAG
+* Date/Publication: 2023-10-06 18:50:02 UTC
+* Number of recursive dependencies: 132
+
+Run `revdepcheck::cloud_details(, "streamDAG")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/streamDAG/new/streamDAG.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘streamDAG/DESCRIPTION’ ... OK
+* this is package ‘streamDAG’ version ‘1.5’
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘asbio’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/streamDAG/old/streamDAG.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘streamDAG/DESCRIPTION’ ... OK
+* this is package ‘streamDAG’ version ‘1.5’
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘asbio’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# SubtypeDrug
+
+
+
+* Version: 0.1.9
+* GitHub: https://github.com/hanjunwei-lab/SubtypeDrug
+* Source code: https://github.com/cran/SubtypeDrug
+* Date/Publication: 2024-04-17 06:40:02 UTC
+* Number of recursive dependencies: 153
+
+Run `revdepcheck::cloud_details(, "SubtypeDrug")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/SubtypeDrug/new/SubtypeDrug.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘SubtypeDrug/DESCRIPTION’ ... OK
+...
+* this is package ‘SubtypeDrug’ version ‘0.1.9’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘ChemmineR’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/SubtypeDrug/old/SubtypeDrug.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘SubtypeDrug/DESCRIPTION’ ... OK
+...
+* this is package ‘SubtypeDrug’ version ‘0.1.9’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘ChemmineR’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# tbm
+
+
+
+* Version: 0.3-6
+* GitHub: NA
+* Source code: https://github.com/cran/tbm
+* Date/Publication: 2024-04-17 12:10:02 UTC
+* Number of recursive dependencies: 47
+
+Run `revdepcheck::cloud_details(, "tbm")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/tbm/new/tbm.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘tbm/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'mlt', 'coneproj'
+
+Package suggested but not available for checking: ‘tram’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/tbm/old/tbm.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘tbm/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'mlt', 'coneproj'
+
+Package suggested but not available for checking: ‘tram’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
-```
-* installing *source* package ‘STREAK’ ...
-** package ‘STREAK’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** data
-*** moving datasets to lazyload DB
-** inst
-** byte-compile and prepare package for lazy loading
-Error in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]) :
- namespace ‘Matrix’ 1.5-4.1 is already loaded, but >= 1.6.1.1 is required
-Calls: ... namespaceImportFrom -> asNamespace -> loadNamespace
-Execution halted
-ERROR: lazy loading failed for package ‘STREAK’
-* removing ‘/tmp/workdir/STREAK/old/STREAK.Rcheck/STREAK’
```
-# streamDAG
+# TH.data
-* Version: 1.5
+* Version: 1.1-2
* GitHub: NA
-* Source code: https://github.com/cran/streamDAG
-* Date/Publication: 2023-10-06 18:50:02 UTC
-* Number of recursive dependencies: 132
+* Source code: https://github.com/cran/TH.data
+* Date/Publication: 2023-04-17 22:10:03 UTC
+* Number of recursive dependencies: 100
-Run `revdepcheck::cloud_details(, "streamDAG")` for more info
+Run `revdepcheck::cloud_details(, "TH.data")` for more info
@@ -10445,7 +13215,7 @@ Run `revdepcheck::cloud_details(, "streamDAG")` for more info
### Devel
```
-* using log directory ‘/tmp/workdir/streamDAG/new/streamDAG.Rcheck’
+* using log directory ‘/tmp/workdir/TH.data/new/TH.data.Rcheck’
* using R version 4.3.1 (2023-06-16)
* using platform: x86_64-pc-linux-gnu (64-bit)
* R was compiled by
@@ -10454,16 +13224,18 @@ Run `revdepcheck::cloud_details(, "streamDAG")` for more info
* running under: Ubuntu 22.04.4 LTS
* using session charset: UTF-8
* using option ‘--no-manual’
-* checking for file ‘streamDAG/DESCRIPTION’ ... OK
-* this is package ‘streamDAG’ version ‘1.5’
-* checking package namespace information ... OK
-* checking package dependencies ... ERROR
-Package required but not available: ‘asbio’
+* checking for file ‘TH.data/DESCRIPTION’ ... OK
+...
+ When sourcing ‘blood_loss_report.R’:
+Error: package ‘mlt’ required by ‘trtf’ could not be found
+Execution halted
-See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
-manual.
+ ‘blood_loss_report.Rnw’ using ‘UTF-8’... failed
+* checking re-building of vignette outputs ... NOTE
+Note: skipping ‘blood_loss_report.Rnw’ due to unavailable dependencies:
+ 'tram', 'rms'
* DONE
-Status: 1 ERROR
+Status: 1 ERROR, 3 NOTEs
@@ -10473,7 +13245,7 @@ Status: 1 ERROR
### CRAN
```
-* using log directory ‘/tmp/workdir/streamDAG/old/streamDAG.Rcheck’
+* using log directory ‘/tmp/workdir/TH.data/old/TH.data.Rcheck’
* using R version 4.3.1 (2023-06-16)
* using platform: x86_64-pc-linux-gnu (64-bit)
* R was compiled by
@@ -10482,16 +13254,18 @@ Status: 1 ERROR
* running under: Ubuntu 22.04.4 LTS
* using session charset: UTF-8
* using option ‘--no-manual’
-* checking for file ‘streamDAG/DESCRIPTION’ ... OK
-* this is package ‘streamDAG’ version ‘1.5’
-* checking package namespace information ... OK
-* checking package dependencies ... ERROR
-Package required but not available: ‘asbio’
+* checking for file ‘TH.data/DESCRIPTION’ ... OK
+...
+ When sourcing ‘blood_loss_report.R’:
+Error: package ‘mlt’ required by ‘trtf’ could not be found
+Execution halted
-See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
-manual.
+ ‘blood_loss_report.Rnw’ using ‘UTF-8’... failed
+* checking re-building of vignette outputs ... NOTE
+Note: skipping ‘blood_loss_report.Rnw’ due to unavailable dependencies:
+ 'tram', 'rms'
* DONE
-Status: 1 ERROR
+Status: 1 ERROR, 3 NOTEs
@@ -10506,7 +13280,7 @@ Status: 1 ERROR
* GitHub: https://github.com/stemangiola/tidyseurat
* Source code: https://github.com/cran/tidyseurat
* Date/Publication: 2024-01-10 04:50:02 UTC
-* Number of recursive dependencies: 207
+* Number of recursive dependencies: 208
Run `revdepcheck::cloud_details(, "tidyseurat")` for more info
@@ -10628,71 +13402,151 @@ ERROR: lazy loading failed for package ‘tidyvpc’
-* Version: 1.0-4
+* Version: 1.0-5
* GitHub: NA
* Source code: https://github.com/cran/tram
-* Date/Publication: 2024-05-13 14:40:02 UTC
-* Number of recursive dependencies: 141
+* Date/Publication: 2024-08-17 15:40:02 UTC
+* Number of recursive dependencies: 170
Run `revdepcheck::cloud_details(, "tram")` for more info
-## In both
+## Error before installation
-* checking whether package ‘tram’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/tram/new/tram.Rcheck/00install.out’ for details.
- ```
+### Devel
-## Installation
+```
+* using log directory ‘/tmp/workdir/tram/new/tram.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘tram/DESCRIPTION’ ... OK
+...
+* this is package ‘tram’ version ‘1.0-5’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘mlt’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/tram/old/tram.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘tram/DESCRIPTION’ ... OK
+...
+* this is package ‘tram’ version ‘1.0-5’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘mlt’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+# tramME
+
+
+
+* Version: 1.0.6
+* GitHub: NA
+* Source code: https://github.com/cran/tramME
+* Date/Publication: 2024-07-02 16:00:02 UTC
+* Number of recursive dependencies: 50
+
+Run `revdepcheck::cloud_details(, "tramME")` for more info
+
+
+
+## Error before installation
### Devel
```
-* installing *source* package ‘tram’ ...
-** package ‘tram’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fvisibility=hidden -fpic -g -O2 -c init.c -o init.o
-gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fvisibility=hidden -fpic -g -O2 -c pnormMRS.c -o pnormMRS.o
-gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o tram.so init.o pnormMRS.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/tram/new/tram.Rcheck/00LOCK-tram/00new/tram/libs
-** R
-** demo
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘mlt’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- there is no package called ‘coneproj’
-Execution halted
-ERROR: lazy loading failed for package ‘tram’
-* removing ‘/tmp/workdir/tram/new/tram.Rcheck/tram’
+* using log directory ‘/tmp/workdir/tramME/new/tramME.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘tramME/DESCRIPTION’ ... OK
+...
+* this is package ‘tramME’ version ‘1.0.6’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'tram', 'mlt', 'coneproj'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘tram’ ...
-** package ‘tram’ successfully unpacked and MD5 sums checked
-** using staged installation
-** libs
-using C compiler: ‘gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0’
-gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fvisibility=hidden -fpic -g -O2 -c init.c -o init.o
-gcc -I"/opt/R/4.3.1/lib/R/include" -DNDEBUG -I/usr/local/include -fvisibility=hidden -fpic -g -O2 -c pnormMRS.c -o pnormMRS.o
-gcc -shared -L/opt/R/4.3.1/lib/R/lib -L/usr/local/lib -o tram.so init.o pnormMRS.o -llapack -lblas -lgfortran -lm -lquadmath -L/opt/R/4.3.1/lib/R/lib -lR
-installing to /tmp/workdir/tram/old/tram.Rcheck/00LOCK-tram/00new/tram/libs
-** R
-** demo
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘mlt’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- there is no package called ‘coneproj’
-Execution halted
-ERROR: lazy loading failed for package ‘tram’
-* removing ‘/tmp/workdir/tram/old/tram.Rcheck/tram’
+* using log directory ‘/tmp/workdir/tramME/old/tramME.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘tramME/DESCRIPTION’ ... OK
+...
+* this is package ‘tramME’ version ‘1.0.6’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'tram', 'mlt', 'coneproj'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
@@ -10710,110 +13564,141 @@ Run `revdepcheck::cloud_details(, "tramnet")` for more info
-## In both
-
-* checking whether package ‘tramnet’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/tramnet/new/tramnet.Rcheck/00install.out’ for details.
- ```
-
-## Installation
+## Error before installation
### Devel
```
-* installing *source* package ‘tramnet’ ...
-** package ‘tramnet’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘mlt’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- there is no package called ‘coneproj’
-Execution halted
-ERROR: lazy loading failed for package ‘tramnet’
-* removing ‘/tmp/workdir/tramnet/new/tramnet.Rcheck/tramnet’
+* using log directory ‘/tmp/workdir/tramnet/new/tramnet.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘tramnet/DESCRIPTION’ ... OK
+...
+* this is package ‘tramnet’ version ‘0.0-8’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'tram', 'mlt'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
### CRAN
```
-* installing *source* package ‘tramnet’ ...
-** package ‘tramnet’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘mlt’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- there is no package called ‘coneproj’
-Execution halted
-ERROR: lazy loading failed for package ‘tramnet’
-* removing ‘/tmp/workdir/tramnet/old/tramnet.Rcheck/tramnet’
+* using log directory ‘/tmp/workdir/tramnet/old/tramnet.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘tramnet/DESCRIPTION’ ... OK
+...
+* this is package ‘tramnet’ version ‘0.0-8’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'tram', 'mlt'
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
```
# tramvs
-
+
+
+* Version: 0.0-6
+* GitHub: NA
+* Source code: https://github.com/cran/tramvs
+* Date/Publication: 2024-09-04 13:50:02 UTC
+* Number of recursive dependencies: 106
+
+Run `revdepcheck::cloud_details(, "tramvs")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/tramvs/new/tramvs.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘tramvs/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'tram', 'cotram'
+
+Packages suggested but not available for checking: 'tramnet', 'mlt'
-* Version: 0.0-4
-* GitHub: NA
-* Source code: https://github.com/cran/tramvs
-* Date/Publication: 2023-03-10 14:20:02 UTC
-* Number of recursive dependencies: 83
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
-Run `revdepcheck::cloud_details(, "tramvs")` for more info
-
-## In both
-* checking whether package ‘tramvs’ can be installed ... ERROR
- ```
- Installation failed.
- See ‘/tmp/workdir/tramvs/new/tramvs.Rcheck/00install.out’ for details.
- ```
-* checking package dependencies ... NOTE
- ```
- Package suggested but not available for checking: ‘tramnet’
- ```
+```
+### CRAN
-## Installation
+```
+* using log directory ‘/tmp/workdir/tramvs/old/tramvs.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘tramvs/DESCRIPTION’ ... OK
+...
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Packages required but not available: 'tram', 'cotram'
-### Devel
+Packages suggested but not available for checking: 'tramnet', 'mlt'
-```
-* installing *source* package ‘tramvs’ ...
-** package ‘tramvs’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘mlt’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- there is no package called ‘coneproj’
-Execution halted
-ERROR: lazy loading failed for package ‘tramvs’
-* removing ‘/tmp/workdir/tramvs/new/tramvs.Rcheck/tramvs’
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
-```
-### CRAN
-```
-* installing *source* package ‘tramvs’ ...
-** package ‘tramvs’ successfully unpacked and MD5 sums checked
-** using staged installation
-** R
-** inst
-** byte-compile and prepare package for lazy loading
-Error: package or namespace load failed for ‘mlt’ in loadNamespace(j <- i[[1L]], c(lib.loc, .libPaths()), versionCheck = vI[[j]]):
- there is no package called ‘coneproj’
-Execution halted
-ERROR: lazy loading failed for package ‘tramvs’
-* removing ‘/tmp/workdir/tramvs/old/tramvs.Rcheck/tramvs’
```
@@ -10951,10 +13836,10 @@ ERROR: lazy loading failed for package ‘TSrepr’
-* Version: 2.6
+* Version: 2.6.1
* GitHub: NA
* Source code: https://github.com/cran/twang
-* Date/Publication: 2023-12-06 00:30:02 UTC
+* Date/Publication: 2024-07-22 16:10:01 UTC
* Number of recursive dependencies: 53
Run `revdepcheck::cloud_details(, "twang")` for more info
@@ -11020,6 +13905,222 @@ ERROR: lazy loading failed for package ‘twang’
* removing ‘/tmp/workdir/twang/old/twang.Rcheck/twang’
+```
+# TwitterAutomatedTrading
+
+
+
+* Version: 0.1.0
+* GitHub: https://github.com/lucasgodeiro/TwitterAutomatedTrading
+* Source code: https://github.com/cran/TwitterAutomatedTrading
+* Date/Publication: 2020-05-31 09:50:13 UTC
+* Number of recursive dependencies: 66
+
+Run `revdepcheck::cloud_details(, "TwitterAutomatedTrading")` for more info
+
+
+
+## In both
+
+* checking whether package ‘TwitterAutomatedTrading’ can be installed ... ERROR
+ ```
+ Installation failed.
+ See ‘/tmp/workdir/TwitterAutomatedTrading/new/TwitterAutomatedTrading.Rcheck/00install.out’ for details.
+ ```
+
+## Installation
+
+### Devel
+
+```
+* installing *source* package ‘TwitterAutomatedTrading’ ...
+** package ‘TwitterAutomatedTrading’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) :
+ there is no package called ‘rjson’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
+Execution halted
+ERROR: lazy loading failed for package ‘TwitterAutomatedTrading’
+* removing ‘/tmp/workdir/TwitterAutomatedTrading/new/TwitterAutomatedTrading.Rcheck/TwitterAutomatedTrading’
+
+
+```
+### CRAN
+
+```
+* installing *source* package ‘TwitterAutomatedTrading’ ...
+** package ‘TwitterAutomatedTrading’ successfully unpacked and MD5 sums checked
+** using staged installation
+** R
+** data
+*** moving datasets to lazyload DB
+** inst
+** byte-compile and prepare package for lazy loading
+Error in loadNamespace(i, c(lib.loc, .libPaths()), versionCheck = vI[[i]]) :
+ there is no package called ‘rjson’
+Calls: ... loadNamespace -> withRestarts -> withOneRestart -> doWithOneRestart
+Execution halted
+ERROR: lazy loading failed for package ‘TwitterAutomatedTrading’
+* removing ‘/tmp/workdir/TwitterAutomatedTrading/old/TwitterAutomatedTrading.Rcheck/TwitterAutomatedTrading’
+
+
+```
+# updog
+
+
+
+* Version: 2.1.5
+* GitHub: https://github.com/dcgerard/updog
+* Source code: https://github.com/cran/updog
+* Date/Publication: 2023-11-29 15:50:02 UTC
+* Number of recursive dependencies: 138
+
+Run `revdepcheck::cloud_details(, "updog")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/updog/new/updog.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘updog/DESCRIPTION’ ... OK
+...
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘multidog.Rmd’ using ‘UTF-8’... OK
+ ‘oracle_calculations.Rmd’ using ‘UTF-8’... OK
+ ‘simulate_ngs.Rmd’ using ‘UTF-8’... OK
+ ‘smells_like_updog.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 2 NOTEs
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/updog/old/updog.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘updog/DESCRIPTION’ ... OK
+...
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘multidog.Rmd’ using ‘UTF-8’... OK
+ ‘oracle_calculations.Rmd’ using ‘UTF-8’... OK
+ ‘simulate_ngs.Rmd’ using ‘UTF-8’... OK
+ ‘smells_like_updog.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 2 NOTEs
+
+
+
+
+
+```
+# valr
+
+
+
+* Version: 0.8.2
+* GitHub: https://github.com/rnabioco/valr
+* Source code: https://github.com/cran/valr
+* Date/Publication: 2024-08-30 22:10:03 UTC
+* Number of recursive dependencies: 176
+
+Run `revdepcheck::cloud_details(, "valr")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/valr/new/valr.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘valr/DESCRIPTION’ ... OK
+...
+* this is package ‘valr’ version ‘0.8.2’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘rtracklayer’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/valr/old/valr.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘valr/DESCRIPTION’ ... OK
+...
+* this is package ‘valr’ version ‘0.8.2’
+* package encoding: UTF-8
+* checking package namespace information ... OK
+* checking package dependencies ... ERROR
+Package required but not available: ‘rtracklayer’
+
+See section ‘The DESCRIPTION file’ in the ‘Writing R Extensions’
+manual.
+* DONE
+Status: 1 ERROR
+
+
+
+
+
```
# vdg
@@ -11220,6 +14321,82 @@ ERROR: lazy loading failed for package ‘WRTDStidal’
* removing ‘/tmp/workdir/WRTDStidal/old/WRTDStidal.Rcheck/WRTDStidal’
+```
+# xnet
+
+
+
+* Version: 0.1.11
+* GitHub: https://github.com/CenterForStatistics-UGent/xnet
+* Source code: https://github.com/cran/xnet
+* Date/Publication: 2020-02-03 19:30:02 UTC
+* Number of recursive dependencies: 91
+
+Run `revdepcheck::cloud_details(, "xnet")` for more info
+
+
+
+## Error before installation
+
+### Devel
+
+```
+* using log directory ‘/tmp/workdir/xnet/new/xnet.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘xnet/DESCRIPTION’ ... OK
+...
+ Running ‘testthat.R’
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘Preparation_example_data.Rmd’ using ‘UTF-8’... OK
+ ‘xnet_ClassStructure.Rmd’ using ‘UTF-8’... OK
+ ‘xnet_ShortIntroduction.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
+
+
+
+
+
+```
+### CRAN
+
+```
+* using log directory ‘/tmp/workdir/xnet/old/xnet.Rcheck’
+* using R version 4.3.1 (2023-06-16)
+* using platform: x86_64-pc-linux-gnu (64-bit)
+* R was compiled by
+ gcc (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+ GNU Fortran (Ubuntu 11.4.0-1ubuntu1~22.04) 11.4.0
+* running under: Ubuntu 22.04.4 LTS
+* using session charset: UTF-8
+* using option ‘--no-manual’
+* checking for file ‘xnet/DESCRIPTION’ ... OK
+...
+ Running ‘testthat.R’
+* checking for unstated dependencies in vignettes ... OK
+* checking package vignettes in ‘inst/doc’ ... OK
+* checking running R code from vignettes ... OK
+ ‘Preparation_example_data.Rmd’ using ‘UTF-8’... OK
+ ‘xnet_ClassStructure.Rmd’ using ‘UTF-8’... OK
+ ‘xnet_ShortIntroduction.Rmd’ using ‘UTF-8’... OK
+* checking re-building of vignette outputs ... OK
+* DONE
+Status: 1 NOTE
+
+
+
+
+
```
# yarrr
diff --git a/revdep/problems.md b/revdep/problems.md
index a0b6266..387718a 100644
--- a/revdep/problems.md
+++ b/revdep/problems.md
@@ -44,84 +44,54 @@ Run `revdepcheck::cloud_details(, "babelmixr2")` for more info
Package suggested but not available for checking: ‘lixoftConnectors’
```
-# CGGP
+# BeeGUTS
-* Version: 1.0.4
-* GitHub: https://github.com/CollinErickson/CGGP
-* Source code: https://github.com/cran/CGGP
-* Date/Publication: 2024-01-23 03:22:57 UTC
-* Number of recursive dependencies: 77
+* Version: 1.1.3
+* GitHub: https://github.com/bgoussen/BeeGUTS
+* Source code: https://github.com/cran/BeeGUTS
+* Date/Publication: 2023-09-18 15:40:02 UTC
+* Number of recursive dependencies: 86
-Run `revdepcheck::cloud_details(, "CGGP")` for more info
+Run `revdepcheck::cloud_details(, "BeeGUTS")` for more info
## Newly broken
-* checking tests ... ERROR
+* checking re-building of vignette outputs ... NOTE
```
- Running ‘testthat.R’
- Running the tests in ‘tests/testthat.R’ failed.
- Complete output:
- > library(testthat)
- > library(CGGP)
- >
- > test_check("CGGP")
- [ FAIL 1 | WARN 2 | SKIP 0 | PASS 695 ]
-
- ══ Failed tests ════════════════════════════════════════════════════════════════
- ── Failure ('testcorr.R:543:9'): Logs work for all ─────────────────────────────
- `numdC` not equal to corr_C_dC_logs$dCdtheta[, (1 + n2 * i - n2):(n2 * i)].
- 1/30 mismatches
- [12] 137283 - 137248 == 34.5
- theta dimension with error is 1 , icor is 10 use_log_scale is TRUE theta is -0.678574629127979
-
- [ FAIL 1 | WARN 2 | SKIP 0 | PASS 695 ]
- Error: Test failures
- Execution halted
+ Error(s) in re-building vignettes:
+ ...
+ --- re-building ‘Tutorial.Rmd’ using rmarkdown
+
+ Quitting from lines 45-58 [example] (Tutorial.Rmd)
+ Error: processing vignette 'Tutorial.Rmd' failed with diagnostics:
+ Stan model 'GUTS_SD' does not contain samples.
+
+ --- failed re-building ‘Tutorial.Rmd’
+
+ SUMMARY: processing the following file failed:
+ ‘Tutorial.Rmd’
+
+ Error: Vignette re-building failed.
+ Execution halted
```
-# circhelp
-
-
-
-* Version: 1.1
-* GitHub: https://github.com/achetverikov/circhelp
-* Source code: https://github.com/cran/circhelp
-* Date/Publication: 2024-07-04 17:10:02 UTC
-* Number of recursive dependencies: 106
-
-Run `revdepcheck::cloud_details(, "circhelp")` for more info
-
-
+## In both
-## Newly broken
+* checking installed package size ... NOTE
+ ```
+ installed size is 78.9Mb
+ sub-directories of 1Mb or more:
+ data 4.0Mb
+ libs 74.3Mb
+ ```
-* checking tests ... ERROR
+* checking for GNU extensions in Makefiles ... NOTE
```
- Running ‘testthat.R’
- Running the tests in ‘tests/testthat.R’ failed.
- Complete output:
- > library(testthat)
- > library(circhelp)
- Loading required package: data.table
- Loading required package: ggplot2
- > library(circular)
-
- Attaching package: 'circular'
- ...
- [1] "Difference between expected and observed correlation is -0.000000"
- [ FAIL 1 | WARN 0 | SKIP 0 | PASS 16 ]
-
- ══ Failed tests ════════════════════════════════════════════════════════════════
- ── Failure ('test-functions.R:70:3'): conversion from circular SD to kappa works both ways ──
- abs(test_sd_deg - vm_kappa_to_circ_sd_deg(kappa_from_deg)) is not strictly less than `tolerance`. Difference: 0.000254
-
- [ FAIL 1 | WARN 0 | SKIP 0 | PASS 16 ]
- Error: Test failures
- Execution halted
+ GNU make is a SystemRequirements.
```
# coro
@@ -165,17 +135,39 @@ Run `revdepcheck::cloud_details(, "coro")` for more info
Execution halted
```
-# Haplin
+# etwfe
-* Version: 7.3.1
-* GitHub: NA
-* Source code: https://github.com/cran/Haplin
-* Date/Publication: 2024-02-08 22:20:02 UTC
-* Number of recursive dependencies: 66
+* Version: 0.4.0
+* GitHub: https://github.com/grantmcdermott/etwfe
+* Source code: https://github.com/cran/etwfe
+* Date/Publication: 2024-02-27 04:20:02 UTC
+* Number of recursive dependencies: 130
+
+Run `revdepcheck::cloud_details(, "etwfe")` for more info
+
+
+
+## Newly broken
+
+* checking re-building of vignette outputs ... NOTE
+ ```
+ Error(s) in re-building vignettes:
+ --- re-building ‘etwfe.Rmd’ using rmarkdown
+ ```
+
+# fauxpas
+
+
-Run `revdepcheck::cloud_details(, "Haplin")` for more info
+* Version: 0.5.2
+* GitHub: https://github.com/sckott/fauxpas
+* Source code: https://github.com/cran/fauxpas
+* Date/Publication: 2023-05-03 08:10:09 UTC
+* Number of recursive dependencies: 59
+
+Run `revdepcheck::cloud_details(, "fauxpas")` for more info
@@ -183,10 +175,10 @@ Run `revdepcheck::cloud_details(, "Haplin")` for more info
* checking installed package size ... NOTE
```
- installed size is 5.4Mb
+ installed size is 5.1Mb
sub-directories of 1Mb or more:
- R 1.5Mb
- extdata 3.0Mb
+ R 4.0Mb
+ doc 1.0Mb
```
# multiverse
@@ -279,17 +271,17 @@ Run `revdepcheck::cloud_details(, "OptimModel")` for more info
--- re-building ‘OptimModel_vignette.Rmd’ using rmarkdown
```
-# polmineR
+# ordinalbayes
-* Version: 0.8.9
-* GitHub: https://github.com/PolMine/polmineR
-* Source code: https://github.com/cran/polmineR
-* Date/Publication: 2023-10-29 21:50:02 UTC
-* Number of recursive dependencies: 97
+* Version: 0.1.1
+* GitHub: https://github.com/kelliejarcher/ordinalbayes
+* Source code: https://github.com/cran/ordinalbayes
+* Date/Publication: 2022-04-06 15:10:02 UTC
+* Number of recursive dependencies: 160
-Run `revdepcheck::cloud_details(, "polmineR")` for more info
+Run `revdepcheck::cloud_details(, "ordinalbayes")` for more info
@@ -297,10 +289,17 @@ Run `revdepcheck::cloud_details(, "polmineR")` for more info
* checking installed package size ... NOTE
```
- installed size is 5.3Mb
+ installed size is 12.3Mb
sub-directories of 1Mb or more:
- R 2.0Mb
- extdata 1.9Mb
+ data 12.0Mb
+ ```
+
+## In both
+
+* checking dependencies in R code ... NOTE
+ ```
+ Namespace in Imports field not imported from: ‘devtools’
+ All declared Imports should be used.
```
# PopED
@@ -375,17 +374,58 @@ Run `revdepcheck::cloud_details(, "PopED")` for more info
test 1.1Mb
```
-# PubChemR
+# posologyr
+
+
+
+* Version: 1.2.6
+* GitHub: https://github.com/levenc/posologyr
+* Source code: https://github.com/cran/posologyr
+* Date/Publication: 2024-08-27 16:30:02 UTC
+* Number of recursive dependencies: 98
+
+Run `revdepcheck::cloud_details(, "posologyr")` for more info
+
+
+
+## Newly broken
+
+* checking re-building of vignette outputs ... NOTE
+ ```
+ Error(s) in re-building vignettes:
+ --- re-building ‘a_posteriori_dosing.Rmd’ using rmarkdown
+
+ Quitting from lines 85-87 [estim_map] (a_posteriori_dosing.Rmd)
+ Error: processing vignette 'a_posteriori_dosing.Rmd' failed with diagnostics:
+ object of type 'closure' is not subsettable
+ --- failed re-building ‘a_posteriori_dosing.Rmd’
+
+ --- re-building ‘a_priori_dosing.Rmd’ using rmarkdown
+
+ ...
+ object of type 'closure' is not subsettable
+ --- failed re-building ‘route_of_administration.Rmd’
+
+ SUMMARY: processing the following files failed:
+ ‘a_posteriori_dosing.Rmd’ ‘a_priori_dosing.Rmd’
+ ‘auc_based_dosing.Rmd’ ‘multiple_endpoints.Rmd’
+ ‘route_of_administration.Rmd’
+
+ Error: Vignette re-building failed.
+ Execution halted
+ ```
+
+# rgho
-* Version: 2.0
-* GitHub: https://github.com/selcukorkmaz/PubChemR
-* Source code: https://github.com/cran/PubChemR
-* Date/Publication: 2024-07-13 06:30:02 UTC
-* Number of recursive dependencies: 68
+* Version: 3.0.2
+* GitHub: https://github.com/aphp/rgho
+* Source code: https://github.com/cran/rgho
+* Date/Publication: 2024-01-19 08:00:02 UTC
+* Number of recursive dependencies: 62
-Run `revdepcheck::cloud_details(, "PubChemR")` for more info
+Run `revdepcheck::cloud_details(, "rgho")` for more info
@@ -396,79 +436,47 @@ Run `revdepcheck::cloud_details(, "PubChemR")` for more info
Running ‘testthat.R’
Running the tests in ‘tests/testthat.R’ failed.
Complete output:
- > # This file is part of the standard setup for testthat.
- > # It is recommended that you do not modify it.
- > #
- > # Where should you do additional test configuration?
- > # Learn more about the roles of various files in:
- > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview
- > # * https://testthat.r-lib.org/articles/special-files.html
+ > library(testthat)
+ > library(rgho)
+ >
+ > test_check("rgho")
+ [ FAIL 2 | WARN 0 | SKIP 2 | PASS 1 ]
+
+ ══ Skipped tests (2) ═══════════════════════════════════════════════════════════
...
- Error in `file(file, "rt")`: cannot open the connection to 'https://pubchem.ncbi.nlm.nih.gov/rest/pug/substance/sid/137349406/xrefs/PatentID/TXT'
- Backtrace:
- ▆
- 1. └─PubChemR::get_pug_rest(...) at test-get_pug_rest.R:80:3
- 2. └─utils::read.table(response$url)
- 3. └─base::file(file, "rt")
+ ── Failure ('test-get_gho.R:37:5'): Connection errors ──────────────────────────
+ `get_gho_values(dimension = "COUNTRY")` produced unexpected messages.
+ Expected match: [45]04
+ Actual values:
+ * Server error: (503) Service Unavailable
+
- [ FAIL 1 | WARN 1 | SKIP 0 | PASS 202 ]
+ [ FAIL 2 | WARN 0 | SKIP 2 | PASS 1 ]
Error: Test failures
Execution halted
```
-* checking running R code from vignettes ... ERROR
- ```
- Errors in running code in vignettes:
- when running code in ‘Exploring_Chemical_Data_with_PubChemR.Rmd’
- ...
-
-
- > result <- get_pug_rest(identifier = "2697049", namespace = "taxid",
- + domain = "taxonomy", operation = "aids", output = "TXT")
- Warning in file(file, "rt") :
- cannot open URL 'https://pubchem.ncbi.nlm.nih.gov/rest/pug/taxonomy/taxid/2697049/aids/TXT': HTTP status was '503 Service Unavailable'
-
- When sourcing ‘Exploring_Chemical_Data_with_PubChemR.R’:
- Error: cannot open the connection to 'https://pubchem.ncbi.nlm.nih.gov/rest/pug/taxonomy/taxid/2697049/aids/TXT'
- Execution halted
-
- ‘Enhancing_Chemical_Data_Access_with_PubChemR.Rmd’ using ‘UTF-8’... OK
- ‘Exploring_Chemical_Data_with_PubChemR.Rmd’ using ‘UTF-8’... failed
- ‘Working_with_PubChemR_to_Access_Chemical_Data.Rmd’ using ‘UTF-8’... OK
- ```
-
-# refer
+# rTensor2
-* Version: 0.1.0
+* Version: 2.0.0
* GitHub: NA
-* Source code: https://github.com/cran/refer
-* Date/Publication: 2021-11-08 12:10:04 UTC
-* Number of recursive dependencies: 28
+* Source code: https://github.com/cran/rTensor2
+* Date/Publication: 2024-03-29 16:30:02 UTC
+* Number of recursive dependencies: 39
-Run `revdepcheck::cloud_details(, "refer")` for more info
+Run `revdepcheck::cloud_details(, "rTensor2")` for more info
## Newly broken
-* checking re-building of vignette outputs ... NOTE
+* checking installed package size ... NOTE
```
- Error(s) in re-building vignettes:
- ...
- --- re-building ‘introRef.Rmd’ using rmarkdown
-
- Quitting from lines 128-132 [unnamed-chunk-16] (introRef.Rmd)
- Error: processing vignette 'introRef.Rmd' failed with diagnostics:
- promise already under evaluation: recursive default argument reference or earlier problems?
- --- failed re-building ‘introRef.Rmd’
-
- SUMMARY: processing the following file failed:
- ‘introRef.Rmd’
-
- Error: Vignette re-building failed.
- Execution halted
+ installed size is 6.4Mb
+ sub-directories of 1Mb or more:
+ data 6.0Mb
```
# rxode2
@@ -498,7 +506,7 @@ Run `revdepcheck::cloud_details(, "rxode2")` for more info
``` r
library(rxode2)
- #> rxode2 2.1.3 using 1 threads (see ?getRxThreads)
+ #> rxode2 2.1.3 using 2 threads (see ?getRxThreads)
...
:1:1: unexpected '<'
1: <
@@ -516,10 +524,10 @@ Run `revdepcheck::cloud_details(, "rxode2")` for more info
* checking installed package size ... NOTE
```
- installed size is 22.1Mb
+ installed size is 22.8Mb
sub-directories of 1Mb or more:
R 1.5Mb
- libs 18.8Mb
+ libs 19.5Mb
```
# spathial
@@ -582,7 +590,7 @@ Run `revdepcheck::cloud_details(, "trampoline")` for more info
Quitting from lines 43-44 [blow_up] (tampolining.Rmd)
Error: processing vignette 'tampolining.Rmd' failed with diagnostics:
- C stack usage 9969444 is too close to the limit
+ C stack usage 9961812 is too close to the limit
--- failed re-building ‘tampolining.Rmd’
SUMMARY: processing the following file failed:
@@ -607,12 +615,53 @@ Run `revdepcheck::cloud_details(, "trampoline")` for more info
> print_numbers(10000)
When sourcing ‘tampolining.R’:
- Error: C stack usage 9968180 is too close to the limit
+ Error: C stack usage 9968228 is too close to the limit
Execution halted
‘tampolining.Rmd’ using ‘UTF-8’... failed
```
+# treesliceR
+
+
+
+* Version: 1.0.2
+* GitHub: https://github.com/AraujoMat/treesliceR
+* Source code: https://github.com/cran/treesliceR
+* Date/Publication: 2024-08-23 18:30:02 UTC
+* Number of recursive dependencies: 159
+
+Run `revdepcheck::cloud_details(, "treesliceR")` for more info
+
+
+
+## Newly broken
+
+* checking tests ... ERROR
+ ```
+ Running ‘testthat.R’
+ Running the tests in ‘tests/testthat.R’ failed.
+ Complete output:
+ > # This file is part of the standard setup for testthat.
+ > # It is recommended that you do not modify it.
+ > #
+ > # Where should you do additional test configuration?
+ > # Learn more about the roles of various files in:
+ > # * https://r-pkgs.org/testing-design.html#sec-tests-files-overview
+ > # * https://testthat.r-lib.org/articles/special-files.html
+ ...
+ ▆
+ 1. ├─base::suppressWarnings(...) at test-CpB.R:31:3
+ 2. │ └─base::withCallingHandlers(...)
+ 3. └─treesliceR::CpB(...) at test-CpB.R:34:5
+ 4. └─foreach::foreach(commu = asb, .combine = rbind) %do% ...
+ 5. └─e$fun(obj, substitute(ex), parent.frame(), e$data)
+
+ [ FAIL 1 | WARN 0 | SKIP 0 | PASS 1743 ]
+ Error: Test failures
+ Execution halted
+ ```
+
# WindCurves
@@ -657,7 +706,7 @@ Run `revdepcheck::cloud_details(, "wordpredictor")` for more info
...
--- re-building ‘features.Rmd’ using rmarkdown
Warning in file("", "w+b") :
- cannot open file '/tmp/RtmpsUf68T/Rfe4a3453de72': No such file or directory
+ cannot open file '/tmp/Rtmph6yuor/Rfcbe17d2b8c': No such file or directory
Quitting from lines 92-121 [data-sampling-1] (features.Rmd)
Error: processing vignette 'features.Rmd' failed with diagnostics:
diff --git a/tests/testthat/test-evaluate.R b/tests/testthat/test-evaluate.R
index 80e2e40..7c6969c 100644
--- a/tests/testthat/test-evaluate.R
+++ b/tests/testthat/test-evaluate.R
@@ -96,24 +96,6 @@ test_that("multiple lines of comments do not lose the terminating \\n", {
expect_equal(ev[[1]]$src, "# foo\n")
})
-test_that("on.exit is evaluated at end of code", {
- ev <- evaluate::evaluate(c(
- "on.exit(print('bye'))",
- "print('hi')"
- ))
- expect_output_types(ev, c("source", "source", "text", "text"))
-})
-
-test_that("return causes an early return", {
- ev <- evaluate::evaluate(c(
- "1 + 1",
- "return()",
- "2 + 2"
- ))
- expect_output_types(ev, c("source", "text", "source"))
-})
-
-
test_that("check_stop_on_error converts integer to enum", {
expect_equal(check_stop_on_error(0), "continue")
expect_equal(check_stop_on_error(1), "stop")