From 7c9a3ba9f7ae70d924af5bd12854bf80bcbaf834 Mon Sep 17 00:00:00 2001 From: Julius Pfadt <38500953+juliuspfadt@users.noreply.github.com> Date: Wed, 16 Oct 2024 14:44:10 +0200 Subject: [PATCH] Covariance matrix input (#239) * cov matrix input for pca efa and cfa * add NEWS file * symmetric check * symmetric check, this time for real * fix some more errors Frantisek found --- .Rprofile | 1 + NEWS.md | 16 + R/confirmatoryfactoranalysis.R | 197 +- R/exploratoryfactoranalysis.R | 39 +- R/principalcomponentanalysis.R | 86 +- inst/qml/ConfirmatoryFactorAnalysis.qml | 16 + inst/qml/ExploratoryFactorAnalysis.qml | 20 +- inst/qml/PrincipalComponentAnalysis.qml | 19 +- renv.lock | 1997 +++++++++++++++-- renv/.gitignore | 7 + renv/activate.R | 1307 +++++++++++ .../test-confirmatoryfactoranalysis.R | 38 +- .../testthat/test-exploratoryfactoranalysis.R | 66 + .../test-principalcomponentanalysis.R | 64 + 14 files changed, 3603 insertions(+), 270 deletions(-) create mode 100644 .Rprofile create mode 100644 NEWS.md create mode 100644 renv/.gitignore create mode 100644 renv/activate.R diff --git a/.Rprofile b/.Rprofile new file mode 100644 index 00000000..81b960f5 --- /dev/null +++ b/.Rprofile @@ -0,0 +1 @@ +source("renv/activate.R") diff --git a/NEWS.md b/NEWS.md new file mode 100644 index 00000000..a06c2000 --- /dev/null +++ b/NEWS.md @@ -0,0 +1,16 @@ +# jaspFactor (development version) + +## [Pull Request #235](https://github.com/jasp-stats/jaspFactor/pull/235): +- CFA: + - Major changes: + - add more estimators to allow robust estimation (ordinal data should be fully supported now) + + - Minor changes CFA: + - Standardized output is restructured + - Standardization now also for bootstrapped estimates + +## [Pull Request #239](https://github.com/jasp-stats/jaspFactor/pull/239): +- add covariance matrix input for CFA, EFA, and PCA + + + diff --git a/R/confirmatoryfactoranalysis.R b/R/confirmatoryfactoranalysis.R index 8161c2c7..eaef4584 100644 --- a/R/confirmatoryfactoranalysis.R +++ b/R/confirmatoryfactoranalysis.R @@ -15,7 +15,6 @@ # - confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, ...) { jaspResults$addCitation("Rosseel, Y. (2012). lavaan: An R Package for Structural Equation Modeling. Journal of Statistical Software, 48(2), 1-36. URL http://www.jstatsoft.org/v48/i02/") @@ -29,23 +28,27 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. # Error checking errors <- .cfaCheckErrors(dataset, options) + # covariance matrix + dataset <- .cfaDataCovariance(dataset, options) + # Main table / model cfaResult <- .cfaComputeResults(jaspResults, dataset, options, errors) # Output tables - .cfaContainerMain( jaspResults, options, cfaResult) # Main table container - .cfaTableMain( jaspResults, options, cfaResult) # Main table with fit info - .cfaTableFitMeasures(jaspResults, options, cfaResult) # Additional fit indices - .cfaTableKMO( jaspResults, options, cfaResult) # Kaiser-Meyer-Olkin test. - .cfaTableBartlett( jaspResults, options, cfaResult) # Bartlett's test of sphericity - .cfaTableRsquared( jaspResults, options, cfaResult) # R-squared of indicators - .cfaTableParEst( jaspResults, options, cfaResult) # Parameter estimates tables - .cfaTableModIndices( jaspResults, options, cfaResult) # Modification Indices - .cfaTableImpliedCov( jaspResults, options, cfaResult) # Implied Covariance matrix - .cfaTableResCov( jaspResults, options, cfaResult) # Residual Covariance Matrix - .cfaTableAve( jaspResults, options, cfaResult) # Average variance explained table - .cfaTableHtmt( jaspResults, options, cfaResult) # Heterotrait monotrait - .cfaTableReliability(jaspResults, options, cfaResult) # Reliability + .cfaContainerMain( jaspResults, options, cfaResult ) # Main table container + .cfaTableMain( jaspResults, options, cfaResult ) # Main table with fit info + .cfaTableFitMeasures(jaspResults, options, cfaResult ) # Additional fit indices + .cfaTableKMO( jaspResults, options, cfaResult ) # Kaiser-Meyer-Olkin test. + .cfaTableBartlett( jaspResults, options, cfaResult ) # Bartlett's test of sphericity + .cfaTableRsquared( jaspResults, options, cfaResult ) # R-squared of indicators + .cfaTableParEst( jaspResults, options, cfaResult ) # Parameter estimates tables + .cfaTableModIndices( jaspResults, options, cfaResult ) # Modification Indices + .cfaTableImpliedCov( jaspResults, options, cfaResult ) # Implied Covariance matrix + .cfaTableResCov( jaspResults, options, cfaResult ) # Residual Covariance Matrix + .cfaTableAve( jaspResults, options, cfaResult ) # Average variance explained table + .cfaTableHtmt( jaspResults, options, cfaResult, dataset ) # Heterotrait monotrait + # weirdly enough I cannot find the exact sample cov matrix in the lavaan output + .cfaTableReliability(jaspResults, options, cfaResult ) # Reliability # Output plots @@ -61,29 +64,32 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. # Preprocessing functions ---- .cfaReadData <- function(dataset, options) { + if (!is.null(dataset)) return(dataset) # NOTE: The GUI does not yet allow for putting the same variable in different factors. # if the same variable is used twice but with a different type then this would # crash the R code. However, since this is not possible yet, this should be okay for now vars <- unlist(lapply(options[["factors"]], `[[`, "indicators"), use.names = FALSE) - types <- unlist(lapply(options[["factors"]], `[[`, "types"), use.names = FALSE) if (length(vars) == 0) return(data.frame()) duplicateVars <- duplicated(vars) vars <- vars[!duplicateVars] - types <- types[!duplicateVars] - splitVars <- split(vars, types) - groupVar <- if (options[["group"]] == "") NULL else options[["group"]] + if (options[["dataType"]] == "raw") { + # make sure on the qml side that groupVar is indeed a nominal variable + groupVar <- if (options[["group"]] == "") NULL else options[["group"]] + dataset <- .readDataSetToEnd(columns = c(vars, groupVar)) - return(.readDataSetToEnd( - columns.as.numeric = splitVars[["scale"]], - columns.as.ordinal = splitVars[["ordinal"]], - columns.as.factor = groupVar - )) + } else { + + dataset <- .readDataSetToEnd(all.columns = TRUE) + } + + + return(dataset) } @@ -100,9 +106,8 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. return(options) } -.cfaCheckErrors <- function(dataset, options) { - # TODO (vankesteren) content error checks, e.g., posdef covmat +.cfaCheckErrors <- function(dataset, options) { # Number of variables in the factors nVarsPerFactor <- unlist(lapply(options$factors, function(x) setNames(length(x$indicators), x$title))) @@ -117,26 +122,35 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. vars <- unique(unlist(lapply(options$factors, function(x) x$indicators))) - if (options$group == "") { + if (options[["dataType"]] == "raw") { - .hasErrors(dataset[, vars], type = 'varCovData', exitAnalysisIfErrors = TRUE, - varCovData.corFun = stats::cov) + # possible cov matrix: + if (ncol(dataset) > 0 && !nrow(dataset) > ncol(dataset)) { + .quitAnalysis(gettext("Not more cases than number of variables. Is your data a variance-covariance matrix?")) + } - } else { + if (options$group == "") { - .hasErrors(dataset, type = "factorLevels", factorLevels.target = options$group, - factorLevels.amount = '< 2', exitAnalysisIfErrors = TRUE) - for (group in levels(dataset[[options$group]])) { + .hasErrors(dataset[, vars], type = 'varCovData', exitAnalysisIfErrors = TRUE, + varCovData.corFun = stats::cov) - idx <- dataset[[options$group]] == group + } else { + + .hasErrors(dataset, type = "factorLevels", factorLevels.target = options$group, + factorLevels.amount = '< 2', exitAnalysisIfErrors = TRUE) + + for (group in levels(dataset[[options$group]])) { - if (any(sapply(dataset[, vars], is.ordered))) { - .hasErrors(dataset[idx, vars], type = 'varCovData', exitAnalysisIfErrors = TRUE, - varCovData.corFun = lavaan::lavCor) - } else { - .hasErrors(dataset[idx, vars], type = 'varCovData', exitAnalysisIfErrors = TRUE, - varCovData.corFun = stats::cov) + idx <- dataset[[options$group]] == group + + if (any(sapply(dataset[, vars], is.ordered))) { + .hasErrors(dataset[idx, vars], type = 'varCovData', exitAnalysisIfErrors = TRUE, + varCovData.corFun = lavaan::lavCor) + } else { + .hasErrors(dataset[idx, vars], type = 'varCovData', exitAnalysisIfErrors = TRUE, + varCovData.corFun = stats::cov) + } } } } @@ -144,6 +158,48 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. return(NULL) } +.cfaDataCovariance <- function(dataset, options) { + + if (options[["dataType"]] == "raw") { + return(dataset) + } + + # possible data matrix? + if ((nrow(dataset) != ncol(dataset)) && !all(dt[lower.tri(dt)] == t(dt)[lower.tri(dt)])) { + .quitAnalysis(gettext("Input data does not seem to be a symmetric matrix! Please check the format of the input data.")) + } + + vars <- unlist(lapply(options[["factors"]], `[[`, "indicators"), use.names = FALSE) + + if (length(vars) == 0) + return(data.frame()) + + duplicateVars <- duplicated(vars) + usedvars <- vars[!duplicateVars] + var_idx <- match(usedvars, colnames(dataset)) + mat <- try(as.matrix(dataset[var_idx, var_idx])) + if (inherits(mat, "try-error")) + .quitAnalysis(gettext("All cells must be numeric.")) + + if (options[["group"]] != "") .quitAnalysis(gettext("Grouping variable not supported for covariance matrix input")) + + if (options[["meanStructure"]]) .quitAnalysis(gettext("Mean structure not supported for covariance matrix input")) + + .hasErrors(mat, type = "varCovMatrix", message='default', exitAnalysisIfErrors = TRUE) + + colnames(mat) <- rownames(mat) <- colnames(dataset)[var_idx] + + if (anyNA(mat)) { + inds <- which(is.na(mat)) + mat <- mat[-inds, -inds] + if (ncol(mat) < 3) { + .quitAnalysis("Not enough valid columns to run this analysis") + } + } + return(mat) +} + + .translateFactorNames <- function(factor_name, options, back = FALSE) { # make dictionary fac_names <- vapply(options$factors, function(x) x$name, "name") @@ -192,7 +248,7 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. if (anyNA(dataset)) { naAction <- switch( - options$naAction, + options$naAction, "twoStageRobust" = "robust.two.stage", "twoStage" = "two.stage", options$naAction) @@ -200,9 +256,30 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. naAction <- "listwise" } + # define estimator from options + estimator = switch(options[["estimator"]], + "default" = "default", + "maximumLikelihood" = "ML", + "generalizedLeastSquares" = "GLS", + "weightedLeastSquares" = "WLS", + "unweightedLeastSquares" = "ULS", + "diagonallyWeightedLeastSquares" = "DWLS" + ) + + if (options[["dataType"]] == "raw") { + dt <- dataset + sampCov <- NULL + sampCovN <- NULL + } else { + dt <- NULL + sampCov <- dataset + sampCovN <- options[["sampleSize"]] + } cfaResult[["lav"]] <- try(lavaan::lavaan( model = mod, - data = dataset, + data = dt, + sample.cov = sampCov, + sample.nobs = sampCovN, group = grp, group.equal = geq, meanstructure = options$meanStructure, @@ -273,11 +350,12 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. "all" = "std.all", "latentVariables" = "std.lv", "noExogenousCovariates" = "std.nox") - # change this once jaspSem is merged - cfaResult[["lav"]] <- lavBootstrap(cfaResult[["lav"]], options$bootstrapSamples, + + if (options[["dataType"]] == "varianceCovariance") { + .quitAnalysis(gettext("Bootstrapping is not available for variance-covariance matrix input.")) + } + cfaResult[["lav"]] <- jaspSem::lavBootstrap(cfaResult[["lav"]], options$bootstrapSamples, standard = options[["standardized"]] != "none", typeStd = type) - # cfaResult[["lav"]] <- jaspSem::lavBootstrap(cfaResult[["lav"]], options$bootstrapSamples, - # standard = options[["standardized"]] != "none", typeStd = type) } # Save cfaResult as state so it's available even when opts don't change @@ -285,8 +363,7 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. jaspResults[["stateCFAResult"]]$dependOn(c( "factors", "secondOrder", "residualsCovarying", "meanStructure", "modelIdentification", "factorsUncorrelated", "packageMimiced", "estimator", "naAction", "seType", "bootstrapSamples", - "group", "invarianceTesting", "interceptsFixedToZero", "standardized" - + "group", "invarianceTesting", "interceptsFixedToZero", "standardized", "dataType", "sampleSize" )) return(cfaResult) @@ -314,6 +391,9 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. spec$bootstrap <- TRUE } else { if (options$seType == "robust") { + if (options[["dataType"]] == "varianceCovariance") { + .quitAnalysis(gettext("Robust standard errors are not available for variance-covariance matrix input.")) + } spec$se <- "robust.sem" } else { spec$se <- options$seType @@ -422,7 +502,7 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. jaspResults[["maincontainer"]]$dependOn(c( "factors", "secondOrder", "residualsCovarying", "meanStructure", "modelIdentification", "factorsUncorrelated", "packageMimiced", "estimator", "naAction", "seType", "bootstrapSamples", - "group", "invarianceTesting", "interceptsFixedToZero" + "group", "invarianceTesting", "interceptsFixedToZero", "dataType", "sampleSize" )) } @@ -1369,7 +1449,7 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. } -.cfaTableHtmt <- function(jaspResults, options, cfaResult) { +.cfaTableHtmt <- function(jaspResults, options, cfaResult, dataset) { #### this has an ordering argument that still needs to be implemented once the categorical data stuff is done if (is.null(cfaResult) || !options[["htmt"]] || !is.null(jaspResults[["resHtmtTable"]])) return() @@ -1406,14 +1486,22 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. htmtTable$setData(tmp_dat) } else { - # get the dataset - dataset <- as.data.frame(lavaan::inspect(cfaResult[["lav"]], what = "data")) - colnames(dataset) <- cfaResult[["lav"]]@Data@ov.names[[1]] + if (options[["dataType"]] == "raw") { + # get the dataset + dataset <- as.data.frame(lavaan::inspect(cfaResult[["lav"]], what = "data")) + colnames(dataset) <- cfaResult[["lav"]]@Data@ov.names[[1]] + sampCov <- NULL + } else { + sampCov <- dataset + colnames(sampCov) <- rownames(sampCov) <- cfaResult[["lav"]]@Data@ov.names[[1]] + dataset <- NULL + } + if (is.null(cfaResult[["spec"]][["soIndics"]])) { - htmt_result <- semTools::htmt(model = cfaResult[["model"]], data = dataset, + htmt_result <- semTools::htmt(model = cfaResult[["model"]], data = dataset, sample.cov = sampCov, missing = cfaResult[["lav"]]@Options[["missing"]]) } else { # the htmt does not allow a second order factor, so we take the model syntax without the seco - htmt_result <- semTools::htmt(model = cfaResult[["model_simple"]], data = dataset, + htmt_result <- semTools::htmt(model = cfaResult[["model_simple"]], data = dataset, sample.cov = sampCov, missing = cfaResult[["lav"]]@Options[["missing"]]) } @@ -1425,6 +1513,7 @@ confirmatoryFactorAnalysisInternal <- function(jaspResults, dataset, options, .. } jaspResults[["resHtmtTable"]] <- htmtTable + return() } diff --git a/R/exploratoryfactoranalysis.R b/R/exploratoryfactoranalysis.R index 0bf418ef..c33f2553 100644 --- a/R/exploratoryfactoranalysis.R +++ b/R/exploratoryfactoranalysis.R @@ -19,8 +19,9 @@ exploratoryFactorAnalysisInternal <- function(jaspResults, dataset, options, ... jaspResults$addCitation("Revelle, W. (2018) psych: Procedures for Personality and Psychological Research, Northwestern University, Evanston, Illinois, USA, https://CRAN.R-project.org/package=psych Version = 1.8.12.") # Read dataset - dataset <- .efaReadData(dataset, options) + dataset <- .pcaAndEfaReadData(dataset, options) ready <- length(options$variables) > 1 + dataset <- .pcaAndEfaDataCovariance(dataset, options) if (ready) .efaCheckErrors(dataset, options) @@ -49,16 +50,6 @@ exploratoryFactorAnalysisInternal <- function(jaspResults, dataset, options, ... } -.efaReadData <- function(dataset, options) { - if (!is.null(dataset)) return(dataset) - - if (options[["naAction"]] == "listwise") { - return(.readDataSetToEnd(columns.as.numeric = unlist(options$variables), exclude.na.listwise = unlist(options$variables))) - } else { - return(.readDataSetToEnd(columns.as.numeric = unlist(options$variables))) - } -} - .efaCheckErrors <- function(dataset, options) { customChecksEFA <- list( function() { @@ -101,10 +92,20 @@ exploratoryFactorAnalysisInternal <- function(jaspResults, dataset, options, ... if (all(S == 1)) { return(gettext("Data not valid: all variables are collinear")) } + }, + function() { + if (ncol(dataset) > 0 && !nrow(dataset) > ncol(dataset)) { + return(gettext("Not more cases than number of variables. Is your data a variance-covariance matrix?")) + } } ) - error <- .hasErrors(dataset = dataset, type = c("infinity", "variance"), custom = customChecksEFA, - exitAnalysisIfErrors = TRUE) + + if (options[["dataType"]] == "raw") { + error <- .hasErrors(dataset = dataset, type = c("infinity", "variance"), custom = customChecksEFA, + exitAnalysisIfErrors = TRUE) + } + + return() } @@ -115,7 +116,7 @@ exploratoryFactorAnalysisInternal <- function(jaspResults, dataset, options, ... modelContainer <- createJaspContainer() modelContainer$dependOn(c("rotationMethod", "orthogonalSelector", "obliqueSelector", "variables", "factorCountMethod", "eigenValuesAbove", "manualNumberOfFactors", "naAction", "analysisBasedOn", "factoringMethod", - "parallelAnalysisMethod")) + "parallelAnalysisMethod", "dataType", "sampleSize")) jaspResults[["modelContainer"]] <- modelContainer } @@ -143,7 +144,6 @@ exploratoryFactorAnalysisInternal <- function(jaspResults, dataset, options, ... "minimumChiSquare" = "minchi", "minimumRank" = "minrank" ) - efaResult <- try( psych::fa( r = dataset, @@ -152,7 +152,8 @@ exploratoryFactorAnalysisInternal <- function(jaspResults, dataset, options, ... scores = TRUE, covar = options$analysisBasedOn == "covarianceMatrix", cor = corMethod, - fm = factoringMethod + fm = factoringMethod, + n.obs = ifelse(options[["dataType"]] == "raw", NULL, options[["sampleSize"]]) ) ) @@ -214,10 +215,8 @@ exploratoryFactorAnalysisInternal <- function(jaspResults, dataset, options, ... # I can use stop() because it's caught by the try and the message is put on # on the modelcontainer. if (ncomp == 0) - stop( - gettext("No factors with an eigenvalue > "), options$eigenValuesBox, ". ", - gettext("Maximum observed eigenvalue equals "), round(max(parallelResult$fa.values), 3) - ) + .quitAnalysis( gettextf("No factors with an eigenvalue > %1$s. Maximum observed eigenvalue equals %2$s.", + options$eigenValuesAbove, round(max(parallelResult$fa.values), 3))) return(ncomp) } } diff --git a/R/principalcomponentanalysis.R b/R/principalcomponentanalysis.R index 44efc55c..a1227401 100644 --- a/R/principalcomponentanalysis.R +++ b/R/principalcomponentanalysis.R @@ -20,12 +20,15 @@ principalComponentAnalysisInternal <- function(jaspResults, dataset, options, .. jaspResults$addCitation("Revelle, W. (2018) psych: Procedures for Personality and Psychological Research, Northwestern University, Evanston, Illinois, USA, https://CRAN.R-project.org/package=psych Version = 1.8.12.") # Read dataset - dataset <- .pcaReadData(dataset, options) + dataset <- .pcaAndEfaReadData(dataset, options) ready <- length(options$variables) > 1 + dataset <- .pcaAndEfaDataCovariance(dataset, options) + if (ready) .pcaCheckErrors(dataset, options) + modelContainer <- .pcaModelContainer(jaspResults) # output functions @@ -47,17 +50,59 @@ principalComponentAnalysisInternal <- function(jaspResults, dataset, options, .. } # Preprocessing functions ---- -.pcaReadData <- function(dataset, options) { +.pcaAndEfaReadData <- function(dataset, options) { + + # browser() if (!is.null(dataset)) return(dataset) - if (options[["naAction"]] == "listwise") { - return(.readDataSetToEnd(columns.as.numeric = unlist(options$variables), exclude.na.listwise = unlist(options$variables))) - } else { - return(.readDataSetToEnd(columns.as.numeric = unlist(options$variables))) + if (options[["dataType"]] == "raw") { + if (options[["naAction"]] == "listwise") { + return(.readDataSetToEnd(columns.as.numeric = unlist(options$variables), exclude.na.listwise = unlist(options$variables))) + } else { + + return(.readDataSetToEnd(columns.as.numeric = unlist(options$variables))) + } + } else { # if variance covariance matrix as input + return(.readDataSetToEnd(all.columns = TRUE)) + } + +} + + +.pcaAndEfaDataCovariance <- function(dataset, options) { + + if (options[["dataType"]] == "raw") { + return(dataset) + } + + # possible data matrix? + if ((nrow(dataset) != ncol(dataset)) && !all(dt[lower.tri(dt)] == t(dt)[lower.tri(dt)])) { + .quitAnalysis(gettext("Input data does not seem to be a symmetric matrix! Please check the format of the input data.")) + } + + usedvars <- unlist(options[["variables"]]) + var_idx <- match(usedvars, colnames(dataset)) + mat <- try(as.matrix(dataset[var_idx, var_idx])) + if (inherits(mat, "try-error")) + .quitAnalysis(gettext("All cells must be numeric.")) + + .hasErrors(mat, type = "varCovMatrix", message='default', exitAnalysisIfErrors = TRUE) + + colnames(mat) <- rownames(mat) <- colnames(dataset)[var_idx] + + if (anyNA(mat)) { + inds <- which(is.na(mat)) + mat <- mat[-inds, -inds] + if (ncol(mat) < 3) { + .quitAnalysis("Not enough valid columns to run this analysis") + } } + return(mat) } + .pcaCheckErrors <- function(dataset, options) { + customChecksPCAEFA <- list( function() { if (length(options$variables) > 0 && options$componentCountMethod == "manual" && @@ -99,10 +144,19 @@ principalComponentAnalysisInternal <- function(jaspResults, dataset, options, .. if (all(S == 1)) { return(gettext("Data not valid: all variables are collinear")) } + }, + function() { + if (ncol(dataset) > 0 && !nrow(dataset) > ncol(dataset)) { + return(gettext("Not more cases than number of variables. Is your data a variance-covariance matrix?")) + } } ) - error <- .hasErrors(dataset = dataset, type = c("infinity", "variance"), custom = customChecksPCAEFA, - exitAnalysisIfErrors = TRUE) + + if (options[["dataType"]] == "raw") { + error <- .hasErrors(dataset = dataset, type = c("infinity", "variance"), custom = customChecksPCAEFA, + exitAnalysisIfErrors = TRUE) + } + return() } @@ -113,7 +167,7 @@ principalComponentAnalysisInternal <- function(jaspResults, dataset, options, .. modelContainer <- createJaspContainer() modelContainer$dependOn(c("rotationMethod", "orthogonalSelector", "obliqueSelector", "variables", "componentCountMethod", "eigenValuesAbove", "manualNumberOfComponents", "naAction", "analysisBasedOn", - "parallelAnalysisMethod")) + "parallelAnalysisMethod", "dataType", "sampleSize")) jaspResults[["modelContainer"]] <- modelContainer } @@ -148,7 +202,6 @@ principalComponentAnalysisInternal <- function(jaspResults, dataset, options, .. "correlationMatrix" = "cor", "covarianceMatrix" = "cov", "polyTetrachoricCorrelationMatrix" = "mixed") - pcaResult <- try( psych::principal( r = dataset, @@ -156,7 +209,8 @@ principalComponentAnalysisInternal <- function(jaspResults, dataset, options, .. rotate = rotate, scores = TRUE, covar = options$analysisBasedOn == "covarianceMatrix", - cor = corMethod + cor = corMethod, + n.obs = ifelse(options[["dataType"]] == "raw", NULL, options[["sampleSize"]]) )) if (isTryError(pcaResult)) { @@ -210,10 +264,8 @@ principalComponentAnalysisInternal <- function(jaspResults, dataset, options, .. # I can use stop() because it's caught by the try and the message is put on # on the modelcontainer. if (ncomp == 0) - stop( - gettext("No components with an eigenvalue > "), options$eigenValuesBox, ". ", - gettext("Maximum observed eigenvalue equals "), round(max(parallelResult$pc.values), 3) - ) + .quitAnalysis( gettextf("No factors with an eigenvalue > %1$s. Maximum observed eigenvalue equals %2$s.", + options$eigenValuesAbove, round(max(parallelResult$fa.values), 3))) return(ncomp) } @@ -237,12 +289,13 @@ principalComponentAnalysisInternal <- function(jaspResults, dataset, options, .. pcaResults <- .pcaComputeResults(modelContainer, dataset, options) if (modelContainer$getError()) return() - goodnessOfFitTable[["model"]] <- "Model" + goodnessOfFitTable[["chisq"]] <- pcaResults$STATISTIC goodnessOfFitTable[["df"]] <- pcaResults$dof goodnessOfFitTable[["p"]] <- pcaResults$PVAL + if (pcaResults$dof < 0) goodnessOfFitTable$addFootnote(message = gettext("Degrees of freedom below 0, model is unidentified."), symbol = gettext("Warning:")) } @@ -630,3 +683,4 @@ principalComponentAnalysisInternal <- function(jaspResults, dataset, options, .. } + diff --git a/inst/qml/ConfirmatoryFactorAnalysis.qml b/inst/qml/ConfirmatoryFactorAnalysis.qml index f9d16e04..e0a08ba5 100644 --- a/inst/qml/ConfirmatoryFactorAnalysis.qml +++ b/inst/qml/ConfirmatoryFactorAnalysis.qml @@ -31,6 +31,22 @@ Form allowTypeChange: true keepAvailableVariables: true } + Group + { + // columns: 4 + title: qsTr("Data") + RadioButtonGroup + { + name: "dataType" + columns: 2 + RadioButton { value: "raw"; label: qsTr("Raw"); checked: true } + RadioButton + { + value: "varianceCovariance"; label: qsTr("Variance-covariance matrix") + IntegerField { name: "sampleSize"; label: qsTr("Sample size"); defaultValue: 200 } + } + } + } Section { diff --git a/inst/qml/ExploratoryFactorAnalysis.qml b/inst/qml/ExploratoryFactorAnalysis.qml index 78eebab0..272384c8 100644 --- a/inst/qml/ExploratoryFactorAnalysis.qml +++ b/inst/qml/ExploratoryFactorAnalysis.qml @@ -24,7 +24,7 @@ Form VariablesForm { - preferredHeight: jaspTheme.smallDefaultVariablesFormHeight + // preferredHeight: jaspTheme.smallDefaultVariablesFormHeight AvailableVariablesList { name: "allVariablesList" } AssignedVariablesList { @@ -33,6 +33,22 @@ Form title: qsTr("Variables") allowedColumns: ["scale"] } + Group + { + // columns: 4 + title: qsTr("Data") + RadioButtonGroup + { + name: "dataType" + columns: 2 + RadioButton { value: "raw"; label: qsTr("Raw"); checked: true } + RadioButton + { + value: "varianceCovariance"; label: qsTr("Variance-covariance matrix") + IntegerField { name: "sampleSize"; label: qsTr("Sample size"); defaultValue: 200 } + } + } + } } Group @@ -93,6 +109,8 @@ Form label: qsTr("Number of factors") defaultValue: 1 min: 1 + max: variables.count > 1 ? variables.count : 1 + } } } diff --git a/inst/qml/PrincipalComponentAnalysis.qml b/inst/qml/PrincipalComponentAnalysis.qml index 3288e8ab..fadabaa3 100644 --- a/inst/qml/PrincipalComponentAnalysis.qml +++ b/inst/qml/PrincipalComponentAnalysis.qml @@ -24,7 +24,7 @@ Form { VariablesForm { - preferredHeight: jaspTheme.smallDefaultVariablesFormHeight + // preferredHeight: jaspTheme.smallDefaultVariablesFormHeight AvailableVariablesList { name: "allVariablesList" } AssignedVariablesList { @@ -33,6 +33,22 @@ Form title: qsTr("Variables") allowedColumns: ["scale"] } + Group + { + // columns: 4 + title: qsTr("Data") + RadioButtonGroup + { + name: "dataType" + columns: 2 + RadioButton { value: "raw"; label: qsTr("Raw"); checked: true } + RadioButton + { + value: "varianceCovariance"; label: qsTr("Variance-covariance matrix") + IntegerField { name: "sampleSize"; label: qsTr("Sample size"); defaultValue: 200 } + } + } + } } @@ -89,6 +105,7 @@ Form label: qsTr("Number of components") defaultValue: 1 min: 1 + max: variables.count > 1 ? variables.count : 1 } } } diff --git a/renv.lock b/renv.lock index c12a39e8..a789165b 100644 --- a/renv.lock +++ b/renv.lock @@ -12,397 +12,1100 @@ "BH": { "Package": "BH", "Version": "1.84.0-0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "a8235afbcd6316e6e91433ea47661013" }, "Formula": { "Package": "Formula", "Version": "1.2-5", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "stats" + ], + "Hash": "7a29697b75e027767a53fde6c903eca7" }, "GPArotation": { "Package": "GPArotation", "Version": "2024.3-1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "stats" + ], + "Hash": "b8b658ec0d7a6a55d9d01e00e3cafd20" }, "Hmisc": { "Package": "Hmisc", "Version": "5.1-3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "Formula", + "R", + "base64enc", + "cluster", + "colorspace", + "data.table", + "foreign", + "ggplot2", + "grid", + "gridExtra", + "gtable", + "htmlTable", + "htmltools", + "knitr", + "methods", + "nnet", + "rmarkdown", + "rpart", + "viridis" + ], + "Hash": "9a446aea30bff7e8ee20f4c0973e8851" }, "MASS": { "Package": "MASS", - "Version": "7.3-61", - "Source": "Repository" + "Version": "7.3-60.2", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "grDevices", + "graphics", + "methods", + "stats", + "utils" + ], + "Hash": "2f342c46163b0b54d7b64d1f798e2c78" }, "Matrix": { "Package": "Matrix", "Version": "1.7-0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "grDevices", + "graphics", + "grid", + "lattice", + "methods", + "stats", + "utils" + ], + "Hash": "1920b2f11133b12350024297d8a4ff4a" }, "OpenMx": { "Package": "OpenMx", "Version": "2.21.12", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "BH", + "MASS", + "Matrix", + "R", + "Rcpp", + "RcppEigen", + "RcppParallel", + "StanHeaders", + "digest", + "lifecycle", + "methods", + "parallel", + "rpf" + ], + "Hash": "885d2c35062c7e167061e73eaf8fbe87" }, "R6": { "Package": "R6", "Version": "2.5.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "470851b6d5d0ac559e9d01bb352b4021" }, "RColorBrewer": { "Package": "RColorBrewer", "Version": "1.1-3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "45f0398006e83a5b10b72a90663d8d8c" }, "RUnit": { "Package": "RUnit", "Version": "0.4.33", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "graphics", + "methods", + "utils" + ], + "Hash": "5c59eb2efec00154ece54899a052de08" }, "Rcpp": { "Package": "Rcpp", "Version": "1.0.13", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "methods", + "utils" + ], + "Hash": "f27411eb6d9c3dada5edd444b8416675" }, "RcppArmadillo": { "Package": "RcppArmadillo", "Version": "14.0.2-1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "Rcpp", + "methods", + "stats", + "utils" + ], + "Hash": "edff747eebfb8f2e18eed194e000caa1" }, "RcppEigen": { "Package": "RcppEigen", "Version": "0.3.4.0.2", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "Rcpp", + "stats", + "utils" + ], + "Hash": "4ac8e423216b8b70cb9653d1b3f71eb9" }, "RcppParallel": { "Package": "RcppParallel", "Version": "5.1.9", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "f38a72a419b91faac0ce5d9eee04c120" }, "Rcsdp": { "Package": "Rcsdp", "Version": "0.1.57.5", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "methods" + ], + "Hash": "4ec96bf1949318e2daea75059dadd583" }, "Rdpack": { "Package": "Rdpack", "Version": "2.6.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "methods", + "rbibutils", + "tools", + "utils" + ], + "Hash": "24a964d2cf75ad25d7b843856c8d4c93" }, "SEMsens": { "Package": "SEMsens", "Version": "1.5.5", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "lavaan", + "stats" + ], + "Hash": "72d60d2c17ef843b4cf9548f79ba1e81" }, "StanHeaders": { "Package": "StanHeaders", "Version": "2.32.10", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "RcppEigen", + "RcppParallel" + ], + "Hash": "c35dc5b81d7ffb1018aa090dff364ecb" }, "TruncatedNormal": { "Package": "TruncatedNormal", "Version": "2.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "Rcpp", + "RcppArmadillo", + "alabama", + "nleqslv", + "qrng", + "spacefillr" + ], + "Hash": "cfefb1b01e7633fc1917d1b0b60bdf6d" }, "XML": { "Package": "XML", "Version": "3.99-0.17", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "methods", + "utils" + ], + "Hash": "bc2a8a1139d8d4bd9c46086708945124" }, "abind": { "Package": "abind", "Version": "1.4-8", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "methods", + "utils" + ], + "Hash": "2288423bb0f20a457800d7fc47f6aa54" }, "admisc": { "Package": "admisc", "Version": "0.36", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "methods" + ], + "Hash": "e19202c52a440288aed7cfdd1907224a" }, "alabama": { "Package": "alabama", "Version": "2023.1.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "numDeriv" + ], + "Hash": "593db7eb170506e6b61ca0c803201924" + }, + "archive": { + "Package": "archive", + "Version": "1.1.9", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "glue", + "rlang", + "tibble" + ], + "Hash": "d26b62e131d4a8b65aba4e9554a4bf74" }, "arm": { "Package": "arm", "Version": "1.14-4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "MASS", + "Matrix", + "R", + "abind", + "coda", + "grDevices", + "graphics", + "lme4", + "methods", + "nlme", + "stats", + "utils" + ], + "Hash": "4f37635d4d4315785c975b0d89fb8a39" }, "askpass": { "Package": "askpass", "Version": "1.2.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "sys" + ], + "Hash": "c39f4155b3ceb1a9a2799d700fbd4b6a" }, "backports": { "Package": "backports", "Version": "1.5.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "e1e1b9d75c37401117b636b7ae50827a" }, "base64enc": { "Package": "base64enc", "Version": "0.1-3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "543776ae6848fde2f48ff3816d0628bc" }, "boot": { "Package": "boot", - "Version": "1.3-31", - "Source": "Repository" + "Version": "1.3-30", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "graphics", + "stats" + ], + "Hash": "96abeed416a286d4a0f52e550b612343" + }, + "brio": { + "Package": "brio", + "Version": "1.1.5", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "c1ee497a6d999947c2c224ae46799b1a" }, "bslib": { "Package": "bslib", "Version": "0.8.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "base64enc", + "cachem", + "fastmap", + "grDevices", + "htmltools", + "jquerylib", + "jsonlite", + "lifecycle", + "memoise", + "mime", + "rlang", + "sass" + ], + "Hash": "b299c6741ca9746fb227debcb0f9fb6c" }, "cSEM": { "Package": "cSEM", "Version": "0.5.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "MASS", + "Matrix", + "R", + "Rdpack", + "TruncatedNormal", + "alabama", + "cli", + "crayon", + "expm", + "future", + "future.apply", + "lavaan", + "lifecycle", + "magrittr", + "matrixStats", + "matrixcalc", + "polycor", + "progressr", + "psych", + "purrr", + "rlang", + "stats", + "symmoments", + "utils" + ], + "Hash": "46181e3f1e9c2232f6a7ea82d4156b0e" }, "cachem": { "Package": "cachem", "Version": "1.1.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "fastmap", + "rlang" + ], + "Hash": "cd9a672193789068eb5a2aad65a0dedf" }, "callr": { "Package": "callr", "Version": "3.7.6", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "R6", + "processx", + "utils" + ], + "Hash": "d7e13f49c19103ece9e58ad2d83a7354" }, "carData": { "Package": "carData", "Version": "3.0-5", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "ac6cdb8552c61bd36b0e54d07cf2aab7" }, "checkmate": { "Package": "checkmate", "Version": "2.3.2", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "backports", + "utils" + ], + "Hash": "0e14e01ce07e7c88fd25de6d4260d26b" }, "cli": { "Package": "cli", "Version": "3.6.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "utils" + ], + "Hash": "b21916dd77a27642b447374a5d30ecf3" }, "cluster": { "Package": "cluster", "Version": "2.1.6", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "grDevices", + "graphics", + "stats", + "utils" + ], + "Hash": "0aaa05204035dc43ea0004b9c76611dd" }, "coda": { "Package": "coda", "Version": "0.19-4.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "lattice" + ], + "Hash": "af436915c590afc6fffc3ce3a5be1569" }, "codetools": { "Package": "codetools", "Version": "0.2-20", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "61e097f35917d342622f21cdc79c256e" }, "colorspace": { "Package": "colorspace", "Version": "2.1-1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "grDevices", + "graphics", + "methods", + "stats" + ], + "Hash": "d954cb1c57e8d8b756165d7ba18aa55a" }, "combinat": { "Package": "combinat", "Version": "0.0-8", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "f0acb9dcb71a9cd9d5ae233c5035b1c5" }, "corpcor": { "Package": "corpcor", "Version": "1.6.10", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "stats" + ], + "Hash": "17ebe3b6d75d09c5bab3891880b34237" }, "cpp11": { "Package": "cpp11", "Version": "0.5.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "91570bba75d0c9d3f1040c835cee8fba" }, "crayon": { "Package": "crayon", "Version": "1.5.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "grDevices", + "methods", + "utils" + ], + "Hash": "859d96e65ef198fd43e82b9628d593ef" }, "cubature": { "Package": "cubature", "Version": "2.1.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "Rcpp" + ], + "Hash": "ebb09f71a8b5e20c3edeed932c85504a" + }, + "curl": { + "Package": "curl", + "Version": "5.2.3", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "d91263322a58af798f6cf3b13fd56dde" }, "data.table": { "Package": "data.table", "Version": "1.16.2", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "methods" + ], + "Hash": "2e00b378fc3be69c865120d9f313039a" }, "desc": { "Package": "desc", "Version": "1.4.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "R6", + "cli", + "utils" + ], + "Hash": "99b79fcbd6c4d1ce087f5c5c758b384f" + }, + "diffobj": { + "Package": "diffobj", + "Version": "0.3.5", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "crayon", + "methods", + "stats", + "tools", + "utils" + ], + "Hash": "bcaa8b95f8d7d01a5dedfd959ce88ab8" }, "digest": { "Package": "digest", "Version": "0.6.37", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "utils" + ], + "Hash": "33698c4b3127fc9f506654607fb73676" }, "dplyr": { "Package": "dplyr", "Version": "1.1.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "R6", + "cli", + "generics", + "glue", + "lifecycle", + "magrittr", + "methods", + "pillar", + "rlang", + "tibble", + "tidyselect", + "utils", + "vctrs" + ], + "Hash": "fedd9d00c2944ff00a0e2696ccf048ec" }, "evaluate": { "Package": "evaluate", "Version": "1.0.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "3fd29944b231036ad67c3edb32e02201" }, "expm": { "Package": "expm", "Version": "1.0-0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "Matrix", + "methods" + ], + "Hash": "a44b2810f36c1cda5d52eee6ec96cafa" }, "fansi": { "Package": "fansi", "Version": "1.0.6", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "grDevices", + "utils" + ], + "Hash": "962174cf2aeb5b9eea581522286a911f" }, "farver": { "Package": "farver", "Version": "2.1.2", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "680887028577f3fa2a81e410ed0d6e42" }, "fastmap": { "Package": "fastmap", "Version": "1.2.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "aa5e1cd11c2d15497494c5292d7ffcc8" }, "fdrtool": { "Package": "fdrtool", "Version": "1.2.18", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "grDevices", + "graphics", + "stats" + ], + "Hash": "d2a06fbed1234e31c6a872aebbf30057" }, "fontBitstreamVera": { "Package": "fontBitstreamVera", "Version": "0.1.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "f6068021eff4aba735a9b2353516636c" }, "fontLiberation": { "Package": "fontLiberation", "Version": "0.1.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "f918c5e723f86f409912104d5b7a71d6" }, "fontawesome": { "Package": "fontawesome", "Version": "0.5.2", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "htmltools", + "rlang" + ], + "Hash": "c2efdd5f0bcd1ea861c2d4e2a883a67d" }, "fontquiver": { "Package": "fontquiver", "Version": "0.2.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "fontBitstreamVera", + "fontLiberation" + ], + "Hash": "fc0f4226379e451057d55419fd31761e" }, "forcats": { "Package": "forcats", "Version": "1.0.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "glue", + "lifecycle", + "magrittr", + "rlang", + "tibble" + ], + "Hash": "1a0a9a3d5083d0d573c4214576f1e690" }, "foreign": { "Package": "foreign", - "Version": "0.8-87", - "Source": "Repository" + "Version": "0.8-86", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "methods", + "stats", + "utils" + ], + "Hash": "550170303dbb19d07b2bcc288068e7dc" }, "fs": { "Package": "fs", "Version": "1.6.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "methods" + ], + "Hash": "15aeb8c27f5ea5161f9f6a641fafd93a" }, "future": { "Package": "future", "Version": "1.34.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "digest", + "globals", + "listenv", + "parallel", + "parallelly", + "utils" + ], + "Hash": "475771e3edb711591476be387c9a8c2e" }, "future.apply": { "Package": "future.apply", "Version": "1.11.2", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "future", + "globals", + "parallel", + "utils" + ], + "Hash": "afe1507511629f44572e6c53b9baeb7c" }, "gdtools": { "Package": "gdtools", "Version": "0.4.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "Rcpp", + "fontquiver", + "htmltools", + "systemfonts", + "tools" + ], + "Hash": "e8e09897fee8d96f6bb02bf841177d20" }, "generics": { "Package": "generics", "Version": "0.1.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "methods" + ], + "Hash": "15e9634c0fcd294799e9b2e929ed1b86" }, "ggplot2": { "Package": "ggplot2", "Version": "3.5.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "MASS", + "R", + "cli", + "glue", + "grDevices", + "grid", + "gtable", + "isoband", + "lifecycle", + "mgcv", + "rlang", + "scales", + "stats", + "tibble", + "vctrs", + "withr" + ], + "Hash": "44c6a2f8202d5b7e878ea274b1092426" }, "glasso": { "Package": "glasso", "Version": "1.11", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "1e1217c1b472d1dbffda819b57dc6d8d" }, "globals": { "Package": "globals", "Version": "0.16.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "codetools" + ], + "Hash": "2580567908cafd4f187c1e5a91e98b7f" }, "glue": { "Package": "glue", "Version": "1.8.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "methods" + ], + "Hash": "5899f1eaa825580172bb56c08266f37c" }, "gridExtra": { "Package": "gridExtra", "Version": "2.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "grDevices", + "graphics", + "grid", + "gtable", + "utils" + ], + "Hash": "7d7f283939f563670a697165b2cf5560" }, "gridGraphics": { "Package": "gridGraphics", "Version": "0.5-1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "grDevices", + "graphics", + "grid" + ], + "Hash": "5b79228594f02385d4df4979284879ae" }, "gtable": { "Package": "gtable", "Version": "0.3.5", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "glue", + "grid", + "lifecycle", + "rlang" + ], + "Hash": "e18861963cbc65a27736e02b3cd3c4a0" }, "gtools": { "Package": "gtools", "Version": "3.9.5", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "methods", + "stats", + "utils" + ], + "Hash": "588d091c35389f1f4a9d533c8d709b35" }, "highr": { "Package": "highr", "Version": "0.11", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "xfun" + ], + "Hash": "d65ba49117ca223614f71b60d85b8ab7" }, "htmlTable": { "Package": "htmlTable", "Version": "2.4.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "checkmate", + "htmltools", + "htmlwidgets", + "knitr", + "magrittr", + "methods", + "rstudioapi", + "stringr" + ], + "Hash": "ca027d8771f2c039aed82f00a81e725b" }, "htmltools": { "Package": "htmltools", "Version": "0.5.8.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "base64enc", + "digest", + "fastmap", + "grDevices", + "rlang", + "utils" + ], + "Hash": "81d371a9cc60640e74e4ab6ac46dcedc" }, "htmlwidgets": { "Package": "htmlwidgets", "Version": "1.6.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "grDevices", + "htmltools", + "jsonlite", + "knitr", + "rmarkdown", + "yaml" + ], + "Hash": "04291cc45198225444a397606810ac37" + }, + "httr": { + "Package": "httr", + "Version": "1.4.7", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "R6", + "curl", + "jsonlite", + "mime", + "openssl" + ], + "Hash": "ac107251d9d9fd72f0ca8049988f1d7f" }, "igraph": { "Package": "igraph", "Version": "2.0.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "Matrix", + "R", + "cli", + "cpp11", + "grDevices", + "graphics", + "lifecycle", + "magrittr", + "methods", + "pkgconfig", + "rlang", + "stats", + "utils", + "vctrs" + ], + "Hash": "c3b7d801d722e26e4cd888e042bf9af5" }, "isoband": { "Package": "isoband", "Version": "0.2.7", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "grid", + "utils" + ], + "Hash": "0080607b4a1a7b28979aecef976d8bc2" }, "jaspBase": { "Package": "jaspBase", @@ -412,7 +1115,37 @@ "RemoteHost": "api.github.com", "RemoteUsername": "jasp-stats", "RemoteRepo": "jaspBase", - "RemoteSha": "79632a237c7bf6bb9b6c8fdf30cc59abccb923d1" + "RemoteRef": "master", + "RemoteSha": "79632a237c7bf6bb9b6c8fdf30cc59abccb923d1", + "Requirements": [ + "R6", + "Rcpp", + "cli", + "codetools", + "compiler", + "ggplot2", + "grDevices", + "grid", + "gridExtra", + "gridGraphics", + "jaspGraphs", + "jsonlite", + "lifecycle", + "methods", + "modules", + "officer", + "pkgbuild", + "plyr", + "qgraph", + "ragg", + "remotes", + "rjson", + "rvg", + "svglite", + "systemfonts", + "withr" + ], + "Hash": "5e3804868e93e304cb776be34f1d7a18" }, "jaspGraphs": { "Package": "jaspGraphs", @@ -422,7 +1155,21 @@ "RemoteHost": "api.github.com", "RemoteUsername": "jasp-stats", "RemoteRepo": "jaspGraphs", - "RemoteSha": "b2e1799265a0741b49a1ca356f96448091dd8db0" + "RemoteRef": "master", + "RemoteSha": "b2e1799265a0741b49a1ca356f96448091dd8db0", + "Requirements": [ + "R6", + "RColorBrewer", + "ggplot2", + "gridExtra", + "gtable", + "jsonlite", + "lifecycle", + "rlang", + "scales", + "viridisLite" + ], + "Hash": "31b0c580c325e5f061d6f7ea8a65a31d" }, "jaspSem": { "Package": "jaspSem", @@ -432,462 +1179,1358 @@ "RemoteHost": "api.github.com", "RemoteUsername": "jasp-stats", "RemoteRepo": "jaspSem", - "RemoteSha": "c2e6dd28e25b027d452f8dc8eaef9af3615e9b0e" + "RemoteRef": "master", + "RemoteSha": "b1a80b31a4dc85ec8020df4aa0343c64735f259f", + "Requirements": [ + "SEMsens", + "cSEM", + "forcats", + "ggplot2", + "jaspBase", + "jaspGraphs", + "lavaan", + "reshape2", + "semPlot", + "semTools", + "stringr", + "tibble", + "tidyr" + ], + "Hash": "59bf5feb3da79f4527a93f7d0539e54d" + }, + "jaspTools": { + "Package": "jaspTools", + "Version": "0.19.0", + "Source": "GitHub", + "RemoteType": "github", + "RemoteHost": "api.github.com", + "RemoteRepo": "jaspTools", + "RemoteUsername": "jasp-stats", + "RemoteSha": "97d19630ae0f2368269adf3046645fb863c77a3d", + "Requirements": [ + "archive", + "data.table", + "httr", + "jsonlite", + "lifecycle", + "pkgload", + "remotes", + "rjson", + "stringi", + "stringr", + "testthat", + "vdiffr" + ], + "Hash": "55278f5f8842c60ba9ad6f7cbadec1d1" }, "jpeg": { "Package": "jpeg", "Version": "0.1-10", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "031a0b683d001a7519202f0628fc0358" }, "jquerylib": { "Package": "jquerylib", "Version": "0.1.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "htmltools" + ], + "Hash": "5aab57a3bd297eee1c1d862735972182" }, "jsonlite": { "Package": "jsonlite", "Version": "1.8.9", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "methods" + ], + "Hash": "4e993b65c2c3ffbffce7bb3e2c6f832b" }, "knitr": { "Package": "knitr", "Version": "1.48", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "evaluate", + "highr", + "methods", + "tools", + "xfun", + "yaml" + ], + "Hash": "acf380f300c721da9fde7df115a5f86f" }, "kutils": { "Package": "kutils", "Version": "1.73", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "RUnit", + "foreign", + "methods", + "openxlsx", + "plyr", + "stats", + "utils", + "xtable" + ], + "Hash": "3179bf3d4f93867a7ee3e47ecb624dbb" }, "labeling": { "Package": "labeling", "Version": "0.4.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "graphics", + "stats" + ], + "Hash": "b64ec208ac5bc1852b285f665d6368b3" }, "lattice": { "Package": "lattice", "Version": "0.22-6", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "grDevices", + "graphics", + "grid", + "stats", + "utils" + ], + "Hash": "cc5ac1ba4c238c7ca9fa6a87ca11a7e2" }, "lavaan": { "Package": "lavaan", "Version": "0.6-19", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "MASS", + "R", + "graphics", + "methods", + "mnormt", + "numDeriv", + "pbivnorm", + "quadprog", + "stats", + "stats4", + "utils" + ], + "Hash": "78573997f3acd282f34c626ffb6a906d" }, "lifecycle": { "Package": "lifecycle", "Version": "1.0.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "glue", + "rlang" + ], + "Hash": "b8552d117e1b808b09a832f589b79035" }, "lisrelToR": { "Package": "lisrelToR", "Version": "0.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "a2b748e2ada78fe7a8b0f3ab072c3739" }, "listenv": { "Package": "listenv", "Version": "0.9.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "e2fca3e12e4db979dccc6e519b10a7ee" }, "lme4": { "Package": "lme4", "Version": "1.1-35.5", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "MASS", + "Matrix", + "R", + "Rcpp", + "RcppEigen", + "boot", + "graphics", + "grid", + "lattice", + "methods", + "minqa", + "nlme", + "nloptr", + "parallel", + "splines", + "stats", + "utils" + ], + "Hash": "16a08fc75007da0d08e0c0388c7c33e6" }, "magrittr": { "Package": "magrittr", "Version": "2.0.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "7ce2733a9826b3aeb1775d56fd305472" }, "matrixStats": { "Package": "matrixStats", "Version": "1.4.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "8885ffb1f46e820dede6b2ca9442abca" }, "matrixcalc": { "Package": "matrixcalc", "Version": "1.0-6", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "d2ef06fb3e84b679a20de1fc2204b63f" }, "memoise": { "Package": "memoise", "Version": "2.0.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "cachem", + "rlang" + ], + "Hash": "e2817ccf4a065c5d9d7f2cfbe7c1d78c" }, "mgcv": { "Package": "mgcv", "Version": "1.9-1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "Matrix", + "R", + "graphics", + "methods", + "nlme", + "splines", + "stats", + "utils" + ], + "Hash": "110ee9d83b496279960e162ac97764ce" }, "mi": { "Package": "mi", "Version": "1.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "Matrix", + "R", + "arm", + "methods", + "stats4" + ], + "Hash": "b913ecddefb95c7a9b922582d78e33e6" }, "mime": { "Package": "mime", "Version": "0.12", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "tools" + ], + "Hash": "18e9c28c1d3ca1560ce30658b22ce104" }, "minqa": { "Package": "minqa", "Version": "1.2.8", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "Rcpp" + ], + "Hash": "785ef8e22389d4a7634c6c944f2dc07d" }, "mnormt": { "Package": "mnormt", "Version": "2.1.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "c83992ef63553d1e4b97162a4a753470" }, "modules": { "Package": "modules", "Version": "0.13.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "utils" + ], + "Hash": "1485aee3373bcfdbb2dd9048995af2ae" }, "multipol": { "Package": "multipol", "Version": "1.0-9", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "abind" + ], + "Hash": "073f6774a6a53aa67a4141eac944b886" }, "munsell": { "Package": "munsell", "Version": "0.5.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "colorspace", + "methods" + ], + "Hash": "4fd8900853b746af55b81fda99da7695" }, "mvtnorm": { "Package": "mvtnorm", "Version": "1.3-1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "stats" + ], + "Hash": "77c61d51ce0f36e3c1a76e6b295aab31" }, "nleqslv": { "Package": "nleqslv", "Version": "3.3.5", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "982736cfb7276c4d9a2afa4e6b8e95a4" }, "nlme": { "Package": "nlme", - "Version": "3.1-166", - "Source": "Repository" + "Version": "3.1-164", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "graphics", + "lattice", + "stats", + "utils" + ], + "Hash": "a623a2239e642806158bc4dc3f51565d" }, "nloptr": { "Package": "nloptr", "Version": "2.1.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "27550641889a3abf3aec4d91186311ec" }, "nnet": { "Package": "nnet", "Version": "7.3-19", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "stats", + "utils" + ], + "Hash": "2c797b46eea7fb58ede195bc0b1f1138" }, "numDeriv": { "Package": "numDeriv", "Version": "2016.8-1.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "df58958f293b166e4ab885ebcad90e02" }, "officer": { "Package": "officer", "Version": "0.6.7", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R6", + "cli", + "grDevices", + "graphics", + "openssl", + "ragg", + "stats", + "utils", + "uuid", + "xml2", + "zip" + ], + "Hash": "d6c0a4e796301a5d252de42c92a9a8b9" }, "openssl": { "Package": "openssl", "Version": "2.2.2", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "askpass" + ], + "Hash": "d413e0fef796c9401a4419485f709ca1" }, "openxlsx": { "Package": "openxlsx", "Version": "4.2.7.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "Rcpp", + "grDevices", + "methods", + "stats", + "stringi", + "utils", + "zip" + ], + "Hash": "14304e44a0f90fa2d0f905472333c561" }, "parallelly": { "Package": "parallelly", "Version": "1.38.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "parallel", + "tools", + "utils" + ], + "Hash": "6e8b139c1904f5e9e14c69db64453bbe" }, "pbapply": { "Package": "pbapply", "Version": "1.7-2", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "parallel" + ], + "Hash": "68a2d681e10cf72f0afa1d84d45380e5" }, "pbivnorm": { "Package": "pbivnorm", "Version": "0.6.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "643e16a7da6aac3e18cadc3e14abb94b" }, "pillar": { "Package": "pillar", "Version": "1.9.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "cli", + "fansi", + "glue", + "lifecycle", + "rlang", + "utf8", + "utils", + "vctrs" + ], + "Hash": "15da5a8412f317beeee6175fbc76f4bb" }, "pkgbuild": { "Package": "pkgbuild", "Version": "1.4.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "R6", + "callr", + "cli", + "desc", + "processx" + ], + "Hash": "a29e8e134a460a01e0ca67a4763c595b" }, "pkgconfig": { "Package": "pkgconfig", "Version": "2.0.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "utils" + ], + "Hash": "01f28d4278f15c76cddbea05899c5d6f" + }, + "pkgload": { + "Package": "pkgload", + "Version": "1.4.0", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "desc", + "fs", + "glue", + "lifecycle", + "methods", + "pkgbuild", + "processx", + "rlang", + "rprojroot", + "utils", + "withr" + ], + "Hash": "2ec30ffbeec83da57655b850cf2d3e0e" }, "plyr": { "Package": "plyr", "Version": "1.8.9", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "Rcpp" + ], + "Hash": "6b8177fd19982f0020743fadbfdbd933" }, "png": { "Package": "png", "Version": "0.1-8", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "bd54ba8a0a5faded999a7aab6e46b374" }, "polycor": { "Package": "polycor", "Version": "0.8-1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "Matrix", + "R", + "admisc", + "mvtnorm", + "parallel", + "stats" + ], + "Hash": "450633138730dbb436ccfcc48e322a9a" + }, + "praise": { + "Package": "praise", + "Version": "1.0.0", + "Source": "Repository", + "Repository": "CRAN", + "Hash": "a555924add98c99d2f411e37e7d25e9f" }, "processx": { "Package": "processx", "Version": "3.8.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "R6", + "ps", + "utils" + ], + "Hash": "0c90a7d71988856bad2a2a45dd871bb9" }, "progressr": { "Package": "progressr", "Version": "0.14.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "digest", + "utils" + ], + "Hash": "ac50c4ffa8f6a46580dd4d7813add3c4" }, "ps": { "Package": "ps", "Version": "1.8.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "utils" + ], + "Hash": "4b9c8485b0c7eecdf0a9ba5132a45576" }, "psych": { "Package": "psych", "Version": "2.4.6.26", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "GPArotation", + "grDevices", + "graphics", + "lattice", + "methods", + "mnormt", + "nlme", + "parallel", + "stats" + ], + "Hash": "4448d5f3ac3e2cbf79074391d494637e" }, "purrr": { "Package": "purrr", "Version": "1.0.2", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "lifecycle", + "magrittr", + "rlang", + "vctrs" + ], + "Hash": "1cba04a4e9414bdefc9dcaa99649a8dc" }, "qgraph": { "Package": "qgraph", "Version": "1.9.8", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "Hmisc", + "Matrix", + "R", + "Rcpp", + "abind", + "colorspace", + "corpcor", + "fdrtool", + "ggplot2", + "glasso", + "grDevices", + "gtools", + "igraph", + "jpeg", + "lavaan", + "methods", + "parallel", + "pbapply", + "plyr", + "png", + "psych", + "reshape2" + ], + "Hash": "a78e4896ba8e67ceaa1086d664dc72a8" }, "qrng": { "Package": "qrng", "Version": "0.0-10", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "utils" + ], + "Hash": "1da516cc8a9056830eb9b0f5eaf1ebab" }, "quadprog": { "Package": "quadprog", "Version": "1.5-8", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "5f919ae5e7f83a6f91dcf2288943370d" }, "ragg": { "Package": "ragg", "Version": "1.3.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "systemfonts", + "textshaping" + ], + "Hash": "0595fe5e47357111f29ad19101c7d271" }, "rappdirs": { "Package": "rappdirs", "Version": "0.3.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "5e3c5dc0b071b21fa128676560dbe94d" }, "rbibutils": { "Package": "rbibutils", "Version": "2.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "tools", + "utils" + ], + "Hash": "dfc034a172fd88fc66b1a703894c4185" + }, + "rematch2": { + "Package": "rematch2", + "Version": "2.1.2", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "tibble" + ], + "Hash": "76c9e04c712a05848ae7a23d2f170a40" }, "remotes": { "Package": "remotes", "Version": "2.5.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "methods", + "stats", + "tools", + "utils" + ], + "Hash": "3ee025083e66f18db6cf27b56e23e141" + }, + "renv": { + "Package": "renv", + "Version": "1.0.10", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "utils" + ], + "Hash": "d0387d5687ec933dd7587efd4cfa2d85" }, "reshape2": { "Package": "reshape2", "Version": "1.4.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "Rcpp", + "plyr", + "stringr" + ], + "Hash": "bb5996d0bd962d214a11140d77589917" }, "rjson": { "Package": "rjson", "Version": "0.2.23", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "7a04e9eff95857dbf557b4e5f0b3d1a8" }, "rlang": { "Package": "rlang", "Version": "1.1.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "utils" + ], + "Hash": "3eec01f8b1dee337674b2e34ab1f9bc1" }, "rmarkdown": { "Package": "rmarkdown", "Version": "2.28", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "bslib", + "evaluate", + "fontawesome", + "htmltools", + "jquerylib", + "jsonlite", + "knitr", + "methods", + "tinytex", + "tools", + "utils", + "xfun", + "yaml" + ], + "Hash": "062470668513dcda416927085ee9bdc7" }, "rockchalk": { "Package": "rockchalk", "Version": "1.8.157", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "MASS", + "R", + "carData", + "grDevices", + "kutils", + "lme4", + "methods" + ], + "Hash": "367292a743bf9a0965e8da3abacd80a1" }, "rpart": { "Package": "rpart", "Version": "4.1.23", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "grDevices", + "graphics", + "stats" + ], + "Hash": "b3d390424f41d04174cccf84d49676c2" }, "rpf": { "Package": "rpf", "Version": "1.0.14", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "Rcpp", + "RcppEigen", + "lifecycle", + "methods", + "mvtnorm", + "parallel" + ], + "Hash": "c8298c4497dfc962c70c8d740744c9da" + }, + "rprojroot": { + "Package": "rprojroot", + "Version": "2.0.4", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "4c8415e0ec1e29f3f4f6fc108bef0144" }, "rstudioapi": { "Package": "rstudioapi", "Version": "0.16.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "96710351d642b70e8f02ddeb237c46a7" }, "rvg": { "Package": "rvg", "Version": "0.3.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "Rcpp", + "gdtools", + "grDevices", + "officer", + "rlang", + "xml2" + ], + "Hash": "84feb96f75452bfbb4b7858e36bea2c5" }, "sass": { "Package": "sass", "Version": "0.4.9", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R6", + "fs", + "htmltools", + "rappdirs", + "rlang" + ], + "Hash": "d53dbfddf695303ea4ad66f86e99b95d" }, "scales": { "Package": "scales", "Version": "1.3.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "R6", + "RColorBrewer", + "cli", + "farver", + "glue", + "labeling", + "lifecycle", + "munsell", + "rlang", + "viridisLite" + ], + "Hash": "c19df082ba346b0ffa6f833e92de34d1" }, "sem": { "Package": "sem", "Version": "3.1-16", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "MASS", + "R", + "boot", + "mi", + "stats", + "utils" + ], + "Hash": "780e2fbf377bcd8365788eacaea36170" }, "semPlot": { "Package": "semPlot", "Version": "1.1.6", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "OpenMx", + "R", + "XML", + "colorspace", + "corpcor", + "igraph", + "lavaan", + "lisrelToR", + "methods", + "plyr", + "qgraph", + "rockchalk", + "sem" + ], + "Hash": "d0350b1ef5257a441f2d3a2bc06552b0" }, "semTools": { "Package": "semTools", "Version": "0.5-6", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "graphics", + "lavaan", + "methods", + "pbivnorm", + "stats", + "utils" + ], + "Hash": "9374d79226103541b8293009f81da90f" }, "spacefillr": { "Package": "spacefillr", "Version": "0.3.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "Rcpp" + ], + "Hash": "16d32294bfd9e55d295ec40eec8aa89f" }, "stringi": { "Package": "stringi", "Version": "1.8.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "stats", + "tools", + "utils" + ], + "Hash": "39e1144fd75428983dc3f63aa53dfa91" }, "stringr": { "Package": "stringr", "Version": "1.5.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "glue", + "lifecycle", + "magrittr", + "rlang", + "stringi", + "vctrs" + ], + "Hash": "960e2ae9e09656611e0b8214ad543207" }, "svglite": { "Package": "svglite", "Version": "2.1.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cpp11", + "systemfonts" + ], + "Hash": "124a41fdfa23e8691cb744c762f10516" }, "symmoments": { "Package": "symmoments", "Version": "1.2.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "combinat", + "cubature", + "multipol", + "mvtnorm" + ], + "Hash": "64f484977fa9d796b62d5cea5ff863a4" }, "sys": { "Package": "sys", "Version": "3.4.3", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "de342ebfebdbf40477d0758d05426646" }, "systemfonts": { "Package": "systemfonts", "Version": "1.1.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cpp11", + "lifecycle" + ], + "Hash": "213b6b8ed5afbf934843e6c3b090d418" + }, + "testthat": { + "Package": "testthat", + "Version": "3.2.1.1", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "R6", + "brio", + "callr", + "cli", + "desc", + "digest", + "evaluate", + "jsonlite", + "lifecycle", + "magrittr", + "methods", + "pkgload", + "praise", + "processx", + "ps", + "rlang", + "utils", + "waldo", + "withr" + ], + "Hash": "3f6e7e5e2220856ff865e4834766bf2b" }, "textshaping": { "Package": "textshaping", "Version": "0.4.0", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cpp11", + "lifecycle", + "systemfonts" + ], + "Hash": "5142f8bc78ed3d819d26461b641627ce" }, "tibble": { "Package": "tibble", "Version": "3.2.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "fansi", + "lifecycle", + "magrittr", + "methods", + "pillar", + "pkgconfig", + "rlang", + "utils", + "vctrs" + ], + "Hash": "a84e2cc86d07289b3b6f5069df7a004c" }, "tidyr": { "Package": "tidyr", "Version": "1.3.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "cpp11", + "dplyr", + "glue", + "lifecycle", + "magrittr", + "purrr", + "rlang", + "stringr", + "tibble", + "tidyselect", + "utils", + "vctrs" + ], + "Hash": "915fb7ce036c22a6a33b5a8adb712eb1" }, "tidyselect": { "Package": "tidyselect", "Version": "1.2.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "glue", + "lifecycle", + "rlang", + "vctrs", + "withr" + ], + "Hash": "829f27b9c4919c16b593794a6344d6c0" }, "tinytex": { "Package": "tinytex", "Version": "0.53", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "xfun" + ], + "Hash": "9db859e8aabbb474293dde3097839420" }, "utf8": { "Package": "utf8", "Version": "1.2.4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "62b65c52671e6665f803ff02954446e9" }, "uuid": { "Package": "uuid", "Version": "1.2-1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "34e965e62a41fcafb1ca60e9b142085b" }, "vctrs": { "Package": "vctrs", "Version": "0.6.5", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "glue", + "lifecycle", + "rlang" + ], + "Hash": "c03fa420630029418f7e6da3667aac4a" + }, + "vdiffr": { + "Package": "vdiffr", + "Version": "1.0.7", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cpp11", + "diffobj", + "glue", + "grDevices", + "htmltools", + "lifecycle", + "rlang", + "testthat", + "xml2" + ], + "Hash": "c359a4beb35ca8a9ab98646fdd654f0f" }, "viridis": { "Package": "viridis", "Version": "0.6.5", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "ggplot2", + "gridExtra", + "viridisLite" + ], + "Hash": "acd96d9fa70adeea4a5a1150609b9745" }, "viridisLite": { "Package": "viridisLite", "Version": "0.4.2", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R" + ], + "Hash": "c826c7c4241b6fc89ff55aaea3fa7491" + }, + "waldo": { + "Package": "waldo", + "Version": "0.5.3", + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "diffobj", + "glue", + "methods", + "rematch2", + "rlang", + "tibble" + ], + "Hash": "16aa934a49658677d8041df9017329b9" }, "withr": { "Package": "withr", "Version": "3.0.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "grDevices", + "graphics" + ], + "Hash": "07909200e8bbe90426fbfeb73e1e27aa" }, "xfun": { "Package": "xfun", "Version": "0.48", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "grDevices", + "stats", + "tools" + ], + "Hash": "89e455b87c84e227eb7f60a1b4e5fe1f" }, "xml2": { "Package": "xml2", "Version": "1.3.6", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "cli", + "methods", + "rlang" + ], + "Hash": "1d0336142f4cd25d8d23cd3ba7a8fb61" }, "xtable": { "Package": "xtable", "Version": "1.8-4", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Requirements": [ + "R", + "stats", + "utils" + ], + "Hash": "b8acdf8af494d9ec19ccb2481a9b11c2" }, "yaml": { "Package": "yaml", "Version": "2.3.10", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "51dab85c6c98e50a18d7551e9d49f76c" }, "zip": { "Package": "zip", "Version": "2.3.1", - "Source": "Repository" + "Source": "Repository", + "Repository": "CRAN", + "Hash": "fcc4bd8e6da2d2011eb64a5e5cc685ab" } } } diff --git a/renv/.gitignore b/renv/.gitignore new file mode 100644 index 00000000..0ec0cbba --- /dev/null +++ b/renv/.gitignore @@ -0,0 +1,7 @@ +library/ +local/ +cellar/ +lock/ +python/ +sandbox/ +staging/ diff --git a/renv/activate.R b/renv/activate.R new file mode 100644 index 00000000..c19fc3ea --- /dev/null +++ b/renv/activate.R @@ -0,0 +1,1307 @@ + +local({ + + # the requested version of renv + version <- "1.0.10" + attr(version, "sha") <- NULL + + # the project directory + project <- Sys.getenv("RENV_PROJECT") + if (!nzchar(project)) + project <- getwd() + + # use start-up diagnostics if enabled + diagnostics <- Sys.getenv("RENV_STARTUP_DIAGNOSTICS", unset = "FALSE") + if (diagnostics) { + start <- Sys.time() + profile <- tempfile("renv-startup-", fileext = ".Rprof") + utils::Rprof(profile) + on.exit({ + utils::Rprof(NULL) + elapsed <- signif(difftime(Sys.time(), start, units = "auto"), digits = 2L) + writeLines(sprintf("- renv took %s to run the autoloader.", format(elapsed))) + writeLines(sprintf("- Profile: %s", profile)) + print(utils::summaryRprof(profile)) + }, add = TRUE) + } + + # figure out whether the autoloader is enabled + enabled <- local({ + + # first, check config option + override <- getOption("renv.config.autoloader.enabled") + if (!is.null(override)) + return(override) + + # if we're being run in a context where R_LIBS is already set, + # don't load -- presumably we're being run as a sub-process and + # the parent process has already set up library paths for us + rcmd <- Sys.getenv("R_CMD", unset = NA) + rlibs <- Sys.getenv("R_LIBS", unset = NA) + if (!is.na(rlibs) && !is.na(rcmd)) + return(FALSE) + + # next, check environment variables + # TODO: prefer using the configuration one in the future + envvars <- c( + "RENV_CONFIG_AUTOLOADER_ENABLED", + "RENV_AUTOLOADER_ENABLED", + "RENV_ACTIVATE_PROJECT" + ) + + for (envvar in envvars) { + envval <- Sys.getenv(envvar, unset = NA) + if (!is.na(envval)) + return(tolower(envval) %in% c("true", "t", "1")) + } + + # enable by default + TRUE + + }) + + # bail if we're not enabled + if (!enabled) { + + # if we're not enabled, we might still need to manually load + # the user profile here + profile <- Sys.getenv("R_PROFILE_USER", unset = "~/.Rprofile") + if (file.exists(profile)) { + cfg <- Sys.getenv("RENV_CONFIG_USER_PROFILE", unset = "TRUE") + if (tolower(cfg) %in% c("true", "t", "1")) + sys.source(profile, envir = globalenv()) + } + + return(FALSE) + + } + + # avoid recursion + if (identical(getOption("renv.autoloader.running"), TRUE)) { + warning("ignoring recursive attempt to run renv autoloader") + return(invisible(TRUE)) + } + + # signal that we're loading renv during R startup + options(renv.autoloader.running = TRUE) + on.exit(options(renv.autoloader.running = NULL), add = TRUE) + + # signal that we've consented to use renv + options(renv.consent = TRUE) + + # load the 'utils' package eagerly -- this ensures that renv shims, which + # mask 'utils' packages, will come first on the search path + library(utils, lib.loc = .Library) + + # unload renv if it's already been loaded + if ("renv" %in% loadedNamespaces()) + unloadNamespace("renv") + + # load bootstrap tools + ansify <- function(text) { + if (renv_ansify_enabled()) + renv_ansify_enhanced(text) + else + renv_ansify_default(text) + } + + renv_ansify_enabled <- function() { + + override <- Sys.getenv("RENV_ANSIFY_ENABLED", unset = NA) + if (!is.na(override)) + return(as.logical(override)) + + pane <- Sys.getenv("RSTUDIO_CHILD_PROCESS_PANE", unset = NA) + if (identical(pane, "build")) + return(FALSE) + + testthat <- Sys.getenv("TESTTHAT", unset = "false") + if (tolower(testthat) %in% "true") + return(FALSE) + + iderun <- Sys.getenv("R_CLI_HAS_HYPERLINK_IDE_RUN", unset = "false") + if (tolower(iderun) %in% "false") + return(FALSE) + + TRUE + + } + + renv_ansify_default <- function(text) { + text + } + + renv_ansify_enhanced <- function(text) { + + # R help links + pattern <- "`\\?(renv::(?:[^`])+)`" + replacement <- "`\033]8;;ide:help:\\1\a?\\1\033]8;;\a`" + text <- gsub(pattern, replacement, text, perl = TRUE) + + # runnable code + pattern <- "`(renv::(?:[^`])+)`" + replacement <- "`\033]8;;ide:run:\\1\a\\1\033]8;;\a`" + text <- gsub(pattern, replacement, text, perl = TRUE) + + # return ansified text + text + + } + + renv_ansify_init <- function() { + + envir <- renv_envir_self() + if (renv_ansify_enabled()) + assign("ansify", renv_ansify_enhanced, envir = envir) + else + assign("ansify", renv_ansify_default, envir = envir) + + } + + `%||%` <- function(x, y) { + if (is.null(x)) y else x + } + + catf <- function(fmt, ..., appendLF = TRUE) { + + quiet <- getOption("renv.bootstrap.quiet", default = FALSE) + if (quiet) + return(invisible()) + + msg <- sprintf(fmt, ...) + cat(msg, file = stdout(), sep = if (appendLF) "\n" else "") + + invisible(msg) + + } + + header <- function(label, + ..., + prefix = "#", + suffix = "-", + n = min(getOption("width"), 78)) + { + label <- sprintf(label, ...) + n <- max(n - nchar(label) - nchar(prefix) - 2L, 8L) + if (n <= 0) + return(paste(prefix, label)) + + tail <- paste(rep.int(suffix, n), collapse = "") + paste0(prefix, " ", label, " ", tail) + + } + + heredoc <- function(text, leave = 0) { + + # remove leading, trailing whitespace + trimmed <- gsub("^\\s*\\n|\\n\\s*$", "", text) + + # split into lines + lines <- strsplit(trimmed, "\n", fixed = TRUE)[[1L]] + + # compute common indent + indent <- regexpr("[^[:space:]]", lines) + common <- min(setdiff(indent, -1L)) - leave + text <- paste(substring(lines, common), collapse = "\n") + + # substitute in ANSI links for executable renv code + ansify(text) + + } + + startswith <- function(string, prefix) { + substring(string, 1, nchar(prefix)) == prefix + } + + bootstrap <- function(version, library) { + + friendly <- renv_bootstrap_version_friendly(version) + section <- header(sprintf("Bootstrapping renv %s", friendly)) + catf(section) + + # attempt to download renv + catf("- Downloading renv ... ", appendLF = FALSE) + withCallingHandlers( + tarball <- renv_bootstrap_download(version), + error = function(err) { + catf("FAILED") + stop("failed to download:\n", conditionMessage(err)) + } + ) + catf("OK") + on.exit(unlink(tarball), add = TRUE) + + # now attempt to install + catf("- Installing renv ... ", appendLF = FALSE) + withCallingHandlers( + status <- renv_bootstrap_install(version, tarball, library), + error = function(err) { + catf("FAILED") + stop("failed to install:\n", conditionMessage(err)) + } + ) + catf("OK") + + # add empty line to break up bootstrapping from normal output + catf("") + + return(invisible()) + } + + renv_bootstrap_tests_running <- function() { + getOption("renv.tests.running", default = FALSE) + } + + renv_bootstrap_repos <- function() { + + # get CRAN repository + cran <- getOption("renv.repos.cran", "https://cloud.r-project.org") + + # check for repos override + repos <- Sys.getenv("RENV_CONFIG_REPOS_OVERRIDE", unset = NA) + if (!is.na(repos)) { + + # check for RSPM; if set, use a fallback repository for renv + rspm <- Sys.getenv("RSPM", unset = NA) + if (identical(rspm, repos)) + repos <- c(RSPM = rspm, CRAN = cran) + + return(repos) + + } + + # check for lockfile repositories + repos <- tryCatch(renv_bootstrap_repos_lockfile(), error = identity) + if (!inherits(repos, "error") && length(repos)) + return(repos) + + # retrieve current repos + repos <- getOption("repos") + + # ensure @CRAN@ entries are resolved + repos[repos == "@CRAN@"] <- cran + + # add in renv.bootstrap.repos if set + default <- c(FALLBACK = "https://cloud.r-project.org") + extra <- getOption("renv.bootstrap.repos", default = default) + repos <- c(repos, extra) + + # remove duplicates that might've snuck in + dupes <- duplicated(repos) | duplicated(names(repos)) + repos[!dupes] + + } + + renv_bootstrap_repos_lockfile <- function() { + + lockpath <- Sys.getenv("RENV_PATHS_LOCKFILE", unset = "renv.lock") + if (!file.exists(lockpath)) + return(NULL) + + lockfile <- tryCatch(renv_json_read(lockpath), error = identity) + if (inherits(lockfile, "error")) { + warning(lockfile) + return(NULL) + } + + repos <- lockfile$R$Repositories + if (length(repos) == 0) + return(NULL) + + keys <- vapply(repos, `[[`, "Name", FUN.VALUE = character(1)) + vals <- vapply(repos, `[[`, "URL", FUN.VALUE = character(1)) + names(vals) <- keys + + return(vals) + + } + + renv_bootstrap_download <- function(version) { + + sha <- attr(version, "sha", exact = TRUE) + + methods <- if (!is.null(sha)) { + + # attempting to bootstrap a development version of renv + c( + function() renv_bootstrap_download_tarball(sha), + function() renv_bootstrap_download_github(sha) + ) + + } else { + + # attempting to bootstrap a release version of renv + c( + function() renv_bootstrap_download_tarball(version), + function() renv_bootstrap_download_cran_latest(version), + function() renv_bootstrap_download_cran_archive(version) + ) + + } + + for (method in methods) { + path <- tryCatch(method(), error = identity) + if (is.character(path) && file.exists(path)) + return(path) + } + + stop("All download methods failed") + + } + + renv_bootstrap_download_impl <- function(url, destfile) { + + mode <- "wb" + + # https://bugs.r-project.org/bugzilla/show_bug.cgi?id=17715 + fixup <- + Sys.info()[["sysname"]] == "Windows" && + substring(url, 1L, 5L) == "file:" + + if (fixup) + mode <- "w+b" + + args <- list( + url = url, + destfile = destfile, + mode = mode, + quiet = TRUE + ) + + if ("headers" %in% names(formals(utils::download.file))) + { + headers <- renv_bootstrap_download_custom_headers(url) + if (length(headers) && is.character(headers)) + args$headers <- headers + } + + do.call(utils::download.file, args) + + } + + renv_bootstrap_download_custom_headers <- function(url) { + + headers <- getOption("renv.download.headers") + if (is.null(headers)) + return(character()) + + if (!is.function(headers)) + stopf("'renv.download.headers' is not a function") + + headers <- headers(url) + if (length(headers) == 0L) + return(character()) + + if (is.list(headers)) + headers <- unlist(headers, recursive = FALSE, use.names = TRUE) + + ok <- + is.character(headers) && + is.character(names(headers)) && + all(nzchar(names(headers))) + + if (!ok) + stop("invocation of 'renv.download.headers' did not return a named character vector") + + headers + + } + + renv_bootstrap_download_cran_latest <- function(version) { + + spec <- renv_bootstrap_download_cran_latest_find(version) + type <- spec$type + repos <- spec$repos + + baseurl <- utils::contrib.url(repos = repos, type = type) + ext <- if (identical(type, "source")) + ".tar.gz" + else if (Sys.info()[["sysname"]] == "Windows") + ".zip" + else + ".tgz" + name <- sprintf("renv_%s%s", version, ext) + url <- paste(baseurl, name, sep = "/") + + destfile <- file.path(tempdir(), name) + status <- tryCatch( + renv_bootstrap_download_impl(url, destfile), + condition = identity + ) + + if (inherits(status, "condition")) + return(FALSE) + + # report success and return + destfile + + } + + renv_bootstrap_download_cran_latest_find <- function(version) { + + # check whether binaries are supported on this system + binary <- + getOption("renv.bootstrap.binary", default = TRUE) && + !identical(.Platform$pkgType, "source") && + !identical(getOption("pkgType"), "source") && + Sys.info()[["sysname"]] %in% c("Darwin", "Windows") + + types <- c(if (binary) "binary", "source") + + # iterate over types + repositories + for (type in types) { + for (repos in renv_bootstrap_repos()) { + + # build arguments for utils::available.packages() call + args <- list(type = type, repos = repos) + + # add custom headers if available -- note that + # utils::available.packages() will pass this to download.file() + if ("headers" %in% names(formals(utils::download.file))) + { + headers <- renv_bootstrap_download_custom_headers(url) + if (length(headers) && is.character(headers)) + args$headers <- headers + } + + # retrieve package database + db <- tryCatch( + as.data.frame( + do.call(utils::available.packages, args), + stringsAsFactors = FALSE + ), + error = identity + ) + + if (inherits(db, "error")) + next + + # check for compatible entry + entry <- db[db$Package %in% "renv" & db$Version %in% version, ] + if (nrow(entry) == 0) + next + + # found it; return spec to caller + spec <- list(entry = entry, type = type, repos = repos) + return(spec) + + } + } + + # if we got here, we failed to find renv + fmt <- "renv %s is not available from your declared package repositories" + stop(sprintf(fmt, version)) + + } + + renv_bootstrap_download_cran_archive <- function(version) { + + name <- sprintf("renv_%s.tar.gz", version) + repos <- renv_bootstrap_repos() + urls <- file.path(repos, "src/contrib/Archive/renv", name) + destfile <- file.path(tempdir(), name) + + for (url in urls) { + + status <- tryCatch( + renv_bootstrap_download_impl(url, destfile), + condition = identity + ) + + if (identical(status, 0L)) + return(destfile) + + } + + return(FALSE) + + } + + renv_bootstrap_download_tarball <- function(version) { + + # if the user has provided the path to a tarball via + # an environment variable, then use it + tarball <- Sys.getenv("RENV_BOOTSTRAP_TARBALL", unset = NA) + if (is.na(tarball)) + return() + + # allow directories + if (dir.exists(tarball)) { + name <- sprintf("renv_%s.tar.gz", version) + tarball <- file.path(tarball, name) + } + + # bail if it doesn't exist + if (!file.exists(tarball)) { + + # let the user know we weren't able to honour their request + fmt <- "- RENV_BOOTSTRAP_TARBALL is set (%s) but does not exist." + msg <- sprintf(fmt, tarball) + warning(msg) + + # bail + return() + + } + + catf("- Using local tarball '%s'.", tarball) + tarball + + } + + renv_bootstrap_github_token <- function() { + for (envvar in c("GITHUB_TOKEN", "GITHUB_PAT", "GH_TOKEN")) { + envval <- Sys.getenv(envvar, unset = NA) + if (!is.na(envval)) + return(envval) + } + } + + renv_bootstrap_download_github <- function(version) { + + enabled <- Sys.getenv("RENV_BOOTSTRAP_FROM_GITHUB", unset = "TRUE") + if (!identical(enabled, "TRUE")) + return(FALSE) + + # prepare download options + token <- renv_bootstrap_github_token() + if (nzchar(Sys.which("curl")) && nzchar(token)) { + fmt <- "--location --fail --header \"Authorization: token %s\"" + extra <- sprintf(fmt, token) + saved <- options("download.file.method", "download.file.extra") + options(download.file.method = "curl", download.file.extra = extra) + on.exit(do.call(base::options, saved), add = TRUE) + } else if (nzchar(Sys.which("wget")) && nzchar(token)) { + fmt <- "--header=\"Authorization: token %s\"" + extra <- sprintf(fmt, token) + saved <- options("download.file.method", "download.file.extra") + options(download.file.method = "wget", download.file.extra = extra) + on.exit(do.call(base::options, saved), add = TRUE) + } + + url <- file.path("https://api.github.com/repos/rstudio/renv/tarball", version) + name <- sprintf("renv_%s.tar.gz", version) + destfile <- file.path(tempdir(), name) + + status <- tryCatch( + renv_bootstrap_download_impl(url, destfile), + condition = identity + ) + + if (!identical(status, 0L)) + return(FALSE) + + renv_bootstrap_download_augment(destfile) + + return(destfile) + + } + + # Add Sha to DESCRIPTION. This is stop gap until #890, after which we + # can use renv::install() to fully capture metadata. + renv_bootstrap_download_augment <- function(destfile) { + sha <- renv_bootstrap_git_extract_sha1_tar(destfile) + if (is.null(sha)) { + return() + } + + # Untar + tempdir <- tempfile("renv-github-") + on.exit(unlink(tempdir, recursive = TRUE), add = TRUE) + untar(destfile, exdir = tempdir) + pkgdir <- dir(tempdir, full.names = TRUE)[[1]] + + # Modify description + desc_path <- file.path(pkgdir, "DESCRIPTION") + desc_lines <- readLines(desc_path) + remotes_fields <- c( + "RemoteType: github", + "RemoteHost: api.github.com", + "RemoteRepo: renv", + "RemoteUsername: rstudio", + "RemotePkgRef: rstudio/renv", + paste("RemoteRef: ", sha), + paste("RemoteSha: ", sha) + ) + writeLines(c(desc_lines[desc_lines != ""], remotes_fields), con = desc_path) + + # Re-tar + local({ + old <- setwd(tempdir) + on.exit(setwd(old), add = TRUE) + + tar(destfile, compression = "gzip") + }) + invisible() + } + + # Extract the commit hash from a git archive. Git archives include the SHA1 + # hash as the comment field of the tarball pax extended header + # (see https://www.kernel.org/pub/software/scm/git/docs/git-archive.html) + # For GitHub archives this should be the first header after the default one + # (512 byte) header. + renv_bootstrap_git_extract_sha1_tar <- function(bundle) { + + # open the bundle for reading + # We use gzcon for everything because (from ?gzcon) + # > Reading from a connection which does not supply a 'gzip' magic + # > header is equivalent to reading from the original connection + conn <- gzcon(file(bundle, open = "rb", raw = TRUE)) + on.exit(close(conn)) + + # The default pax header is 512 bytes long and the first pax extended header + # with the comment should be 51 bytes long + # `52 comment=` (11 chars) + 40 byte SHA1 hash + len <- 0x200 + 0x33 + res <- rawToChar(readBin(conn, "raw", n = len)[0x201:len]) + + if (grepl("^52 comment=", res)) { + sub("52 comment=", "", res) + } else { + NULL + } + } + + renv_bootstrap_install <- function(version, tarball, library) { + + # attempt to install it into project library + dir.create(library, showWarnings = FALSE, recursive = TRUE) + output <- renv_bootstrap_install_impl(library, tarball) + + # check for successful install + status <- attr(output, "status") + if (is.null(status) || identical(status, 0L)) + return(status) + + # an error occurred; report it + header <- "installation of renv failed" + lines <- paste(rep.int("=", nchar(header)), collapse = "") + text <- paste(c(header, lines, output), collapse = "\n") + stop(text) + + } + + renv_bootstrap_install_impl <- function(library, tarball) { + + # invoke using system2 so we can capture and report output + bin <- R.home("bin") + exe <- if (Sys.info()[["sysname"]] == "Windows") "R.exe" else "R" + R <- file.path(bin, exe) + + args <- c( + "--vanilla", "CMD", "INSTALL", "--no-multiarch", + "-l", shQuote(path.expand(library)), + shQuote(path.expand(tarball)) + ) + + system2(R, args, stdout = TRUE, stderr = TRUE) + + } + + renv_bootstrap_platform_prefix <- function() { + + # construct version prefix + version <- paste(R.version$major, R.version$minor, sep = ".") + prefix <- paste("R", numeric_version(version)[1, 1:2], sep = "-") + + # include SVN revision for development versions of R + # (to avoid sharing platform-specific artefacts with released versions of R) + devel <- + identical(R.version[["status"]], "Under development (unstable)") || + identical(R.version[["nickname"]], "Unsuffered Consequences") + + if (devel) + prefix <- paste(prefix, R.version[["svn rev"]], sep = "-r") + + # build list of path components + components <- c(prefix, R.version$platform) + + # include prefix if provided by user + prefix <- renv_bootstrap_platform_prefix_impl() + if (!is.na(prefix) && nzchar(prefix)) + components <- c(prefix, components) + + # build prefix + paste(components, collapse = "/") + + } + + renv_bootstrap_platform_prefix_impl <- function() { + + # if an explicit prefix has been supplied, use it + prefix <- Sys.getenv("RENV_PATHS_PREFIX", unset = NA) + if (!is.na(prefix)) + return(prefix) + + # if the user has requested an automatic prefix, generate it + auto <- Sys.getenv("RENV_PATHS_PREFIX_AUTO", unset = NA) + if (is.na(auto) && getRversion() >= "4.4.0") + auto <- "TRUE" + + if (auto %in% c("TRUE", "True", "true", "1")) + return(renv_bootstrap_platform_prefix_auto()) + + # empty string on failure + "" + + } + + renv_bootstrap_platform_prefix_auto <- function() { + + prefix <- tryCatch(renv_bootstrap_platform_os(), error = identity) + if (inherits(prefix, "error") || prefix %in% "unknown") { + + msg <- paste( + "failed to infer current operating system", + "please file a bug report at https://github.com/rstudio/renv/issues", + sep = "; " + ) + + warning(msg) + + } + + prefix + + } + + renv_bootstrap_platform_os <- function() { + + sysinfo <- Sys.info() + sysname <- sysinfo[["sysname"]] + + # handle Windows + macOS up front + if (sysname == "Windows") + return("windows") + else if (sysname == "Darwin") + return("macos") + + # check for os-release files + for (file in c("/etc/os-release", "/usr/lib/os-release")) + if (file.exists(file)) + return(renv_bootstrap_platform_os_via_os_release(file, sysinfo)) + + # check for redhat-release files + if (file.exists("/etc/redhat-release")) + return(renv_bootstrap_platform_os_via_redhat_release()) + + "unknown" + + } + + renv_bootstrap_platform_os_via_os_release <- function(file, sysinfo) { + + # read /etc/os-release + release <- utils::read.table( + file = file, + sep = "=", + quote = c("\"", "'"), + col.names = c("Key", "Value"), + comment.char = "#", + stringsAsFactors = FALSE + ) + + vars <- as.list(release$Value) + names(vars) <- release$Key + + # get os name + os <- tolower(sysinfo[["sysname"]]) + + # read id + id <- "unknown" + for (field in c("ID", "ID_LIKE")) { + if (field %in% names(vars) && nzchar(vars[[field]])) { + id <- vars[[field]] + break + } + } + + # read version + version <- "unknown" + for (field in c("UBUNTU_CODENAME", "VERSION_CODENAME", "VERSION_ID", "BUILD_ID")) { + if (field %in% names(vars) && nzchar(vars[[field]])) { + version <- vars[[field]] + break + } + } + + # join together + paste(c(os, id, version), collapse = "-") + + } + + renv_bootstrap_platform_os_via_redhat_release <- function() { + + # read /etc/redhat-release + contents <- readLines("/etc/redhat-release", warn = FALSE) + + # infer id + id <- if (grepl("centos", contents, ignore.case = TRUE)) + "centos" + else if (grepl("redhat", contents, ignore.case = TRUE)) + "redhat" + else + "unknown" + + # try to find a version component (very hacky) + version <- "unknown" + + parts <- strsplit(contents, "[[:space:]]")[[1L]] + for (part in parts) { + + nv <- tryCatch(numeric_version(part), error = identity) + if (inherits(nv, "error")) + next + + version <- nv[1, 1] + break + + } + + paste(c("linux", id, version), collapse = "-") + + } + + renv_bootstrap_library_root_name <- function(project) { + + # use project name as-is if requested + asis <- Sys.getenv("RENV_PATHS_LIBRARY_ROOT_ASIS", unset = "FALSE") + if (asis) + return(basename(project)) + + # otherwise, disambiguate based on project's path + id <- substring(renv_bootstrap_hash_text(project), 1L, 8L) + paste(basename(project), id, sep = "-") + + } + + renv_bootstrap_library_root <- function(project) { + + prefix <- renv_bootstrap_profile_prefix() + + path <- Sys.getenv("RENV_PATHS_LIBRARY", unset = NA) + if (!is.na(path)) + return(paste(c(path, prefix), collapse = "/")) + + path <- renv_bootstrap_library_root_impl(project) + if (!is.null(path)) { + name <- renv_bootstrap_library_root_name(project) + return(paste(c(path, prefix, name), collapse = "/")) + } + + renv_bootstrap_paths_renv("library", project = project) + + } + + renv_bootstrap_library_root_impl <- function(project) { + + root <- Sys.getenv("RENV_PATHS_LIBRARY_ROOT", unset = NA) + if (!is.na(root)) + return(root) + + type <- renv_bootstrap_project_type(project) + if (identical(type, "package")) { + userdir <- renv_bootstrap_user_dir() + return(file.path(userdir, "library")) + } + + } + + renv_bootstrap_validate_version <- function(version, description = NULL) { + + # resolve description file + # + # avoid passing lib.loc to `packageDescription()` below, since R will + # use the loaded version of the package by default anyhow. note that + # this function should only be called after 'renv' is loaded + # https://github.com/rstudio/renv/issues/1625 + description <- description %||% packageDescription("renv") + + # check whether requested version 'version' matches loaded version of renv + sha <- attr(version, "sha", exact = TRUE) + valid <- if (!is.null(sha)) + renv_bootstrap_validate_version_dev(sha, description) + else + renv_bootstrap_validate_version_release(version, description) + + if (valid) + return(TRUE) + + # the loaded version of renv doesn't match the requested version; + # give the user instructions on how to proceed + dev <- identical(description[["RemoteType"]], "github") + remote <- if (dev) + paste("rstudio/renv", description[["RemoteSha"]], sep = "@") + else + paste("renv", description[["Version"]], sep = "@") + + # display both loaded version + sha if available + friendly <- renv_bootstrap_version_friendly( + version = description[["Version"]], + sha = if (dev) description[["RemoteSha"]] + ) + + fmt <- heredoc(" + renv %1$s was loaded from project library, but this project is configured to use renv %2$s. + - Use `renv::record(\"%3$s\")` to record renv %1$s in the lockfile. + - Use `renv::restore(packages = \"renv\")` to install renv %2$s into the project library. + ") + catf(fmt, friendly, renv_bootstrap_version_friendly(version), remote) + + FALSE + + } + + renv_bootstrap_validate_version_dev <- function(version, description) { + expected <- description[["RemoteSha"]] + is.character(expected) && startswith(expected, version) + } + + renv_bootstrap_validate_version_release <- function(version, description) { + expected <- description[["Version"]] + is.character(expected) && identical(expected, version) + } + + renv_bootstrap_hash_text <- function(text) { + + hashfile <- tempfile("renv-hash-") + on.exit(unlink(hashfile), add = TRUE) + + writeLines(text, con = hashfile) + tools::md5sum(hashfile) + + } + + renv_bootstrap_load <- function(project, libpath, version) { + + # try to load renv from the project library + if (!requireNamespace("renv", lib.loc = libpath, quietly = TRUE)) + return(FALSE) + + # warn if the version of renv loaded does not match + renv_bootstrap_validate_version(version) + + # execute renv load hooks, if any + hooks <- getHook("renv::autoload") + for (hook in hooks) + if (is.function(hook)) + tryCatch(hook(), error = warnify) + + # load the project + renv::load(project) + + TRUE + + } + + renv_bootstrap_profile_load <- function(project) { + + # if RENV_PROFILE is already set, just use that + profile <- Sys.getenv("RENV_PROFILE", unset = NA) + if (!is.na(profile) && nzchar(profile)) + return(profile) + + # check for a profile file (nothing to do if it doesn't exist) + path <- renv_bootstrap_paths_renv("profile", profile = FALSE, project = project) + if (!file.exists(path)) + return(NULL) + + # read the profile, and set it if it exists + contents <- readLines(path, warn = FALSE) + if (length(contents) == 0L) + return(NULL) + + # set RENV_PROFILE + profile <- contents[[1L]] + if (!profile %in% c("", "default")) + Sys.setenv(RENV_PROFILE = profile) + + profile + + } + + renv_bootstrap_profile_prefix <- function() { + profile <- renv_bootstrap_profile_get() + if (!is.null(profile)) + return(file.path("profiles", profile, "renv")) + } + + renv_bootstrap_profile_get <- function() { + profile <- Sys.getenv("RENV_PROFILE", unset = "") + renv_bootstrap_profile_normalize(profile) + } + + renv_bootstrap_profile_set <- function(profile) { + profile <- renv_bootstrap_profile_normalize(profile) + if (is.null(profile)) + Sys.unsetenv("RENV_PROFILE") + else + Sys.setenv(RENV_PROFILE = profile) + } + + renv_bootstrap_profile_normalize <- function(profile) { + + if (is.null(profile) || profile %in% c("", "default")) + return(NULL) + + profile + + } + + renv_bootstrap_path_absolute <- function(path) { + + substr(path, 1L, 1L) %in% c("~", "/", "\\") || ( + substr(path, 1L, 1L) %in% c(letters, LETTERS) && + substr(path, 2L, 3L) %in% c(":/", ":\\") + ) + + } + + renv_bootstrap_paths_renv <- function(..., profile = TRUE, project = NULL) { + renv <- Sys.getenv("RENV_PATHS_RENV", unset = "renv") + root <- if (renv_bootstrap_path_absolute(renv)) NULL else project + prefix <- if (profile) renv_bootstrap_profile_prefix() + components <- c(root, renv, prefix, ...) + paste(components, collapse = "/") + } + + renv_bootstrap_project_type <- function(path) { + + descpath <- file.path(path, "DESCRIPTION") + if (!file.exists(descpath)) + return("unknown") + + desc <- tryCatch( + read.dcf(descpath, all = TRUE), + error = identity + ) + + if (inherits(desc, "error")) + return("unknown") + + type <- desc$Type + if (!is.null(type)) + return(tolower(type)) + + package <- desc$Package + if (!is.null(package)) + return("package") + + "unknown" + + } + + renv_bootstrap_user_dir <- function() { + dir <- renv_bootstrap_user_dir_impl() + path.expand(chartr("\\", "/", dir)) + } + + renv_bootstrap_user_dir_impl <- function() { + + # use local override if set + override <- getOption("renv.userdir.override") + if (!is.null(override)) + return(override) + + # use R_user_dir if available + tools <- asNamespace("tools") + if (is.function(tools$R_user_dir)) + return(tools$R_user_dir("renv", "cache")) + + # try using our own backfill for older versions of R + envvars <- c("R_USER_CACHE_DIR", "XDG_CACHE_HOME") + for (envvar in envvars) { + root <- Sys.getenv(envvar, unset = NA) + if (!is.na(root)) + return(file.path(root, "R/renv")) + } + + # use platform-specific default fallbacks + if (Sys.info()[["sysname"]] == "Windows") + file.path(Sys.getenv("LOCALAPPDATA"), "R/cache/R/renv") + else if (Sys.info()[["sysname"]] == "Darwin") + "~/Library/Caches/org.R-project.R/R/renv" + else + "~/.cache/R/renv" + + } + + renv_bootstrap_version_friendly <- function(version, shafmt = NULL, sha = NULL) { + sha <- sha %||% attr(version, "sha", exact = TRUE) + parts <- c(version, sprintf(shafmt %||% " [sha: %s]", substring(sha, 1L, 7L))) + paste(parts, collapse = "") + } + + renv_bootstrap_exec <- function(project, libpath, version) { + if (!renv_bootstrap_load(project, libpath, version)) + renv_bootstrap_run(version, libpath) + } + + renv_bootstrap_run <- function(version, libpath) { + + # perform bootstrap + bootstrap(version, libpath) + + # exit early if we're just testing bootstrap + if (!is.na(Sys.getenv("RENV_BOOTSTRAP_INSTALL_ONLY", unset = NA))) + return(TRUE) + + # try again to load + if (requireNamespace("renv", lib.loc = libpath, quietly = TRUE)) { + return(renv::load(project = getwd())) + } + + # failed to download or load renv; warn the user + msg <- c( + "Failed to find an renv installation: the project will not be loaded.", + "Use `renv::activate()` to re-initialize the project." + ) + + warning(paste(msg, collapse = "\n"), call. = FALSE) + + } + + renv_json_read <- function(file = NULL, text = NULL) { + + jlerr <- NULL + + # if jsonlite is loaded, use that instead + if ("jsonlite" %in% loadedNamespaces()) { + + json <- tryCatch(renv_json_read_jsonlite(file, text), error = identity) + if (!inherits(json, "error")) + return(json) + + jlerr <- json + + } + + # otherwise, fall back to the default JSON reader + json <- tryCatch(renv_json_read_default(file, text), error = identity) + if (!inherits(json, "error")) + return(json) + + # report an error + if (!is.null(jlerr)) + stop(jlerr) + else + stop(json) + + } + + renv_json_read_jsonlite <- function(file = NULL, text = NULL) { + text <- paste(text %||% readLines(file, warn = FALSE), collapse = "\n") + jsonlite::fromJSON(txt = text, simplifyVector = FALSE) + } + + renv_json_read_default <- function(file = NULL, text = NULL) { + + # find strings in the JSON + text <- paste(text %||% readLines(file, warn = FALSE), collapse = "\n") + pattern <- '["](?:(?:\\\\.)|(?:[^"\\\\]))*?["]' + locs <- gregexpr(pattern, text, perl = TRUE)[[1]] + + # if any are found, replace them with placeholders + replaced <- text + strings <- character() + replacements <- character() + + if (!identical(c(locs), -1L)) { + + # get the string values + starts <- locs + ends <- locs + attr(locs, "match.length") - 1L + strings <- substring(text, starts, ends) + + # only keep those requiring escaping + strings <- grep("[[\\]{}:]", strings, perl = TRUE, value = TRUE) + + # compute replacements + replacements <- sprintf('"\032%i\032"', seq_along(strings)) + + # replace the strings + mapply(function(string, replacement) { + replaced <<- sub(string, replacement, replaced, fixed = TRUE) + }, strings, replacements) + + } + + # transform the JSON into something the R parser understands + transformed <- replaced + transformed <- gsub("{}", "`names<-`(list(), character())", transformed, fixed = TRUE) + transformed <- gsub("[[{]", "list(", transformed, perl = TRUE) + transformed <- gsub("[]}]", ")", transformed, perl = TRUE) + transformed <- gsub(":", "=", transformed, fixed = TRUE) + text <- paste(transformed, collapse = "\n") + + # parse it + json <- parse(text = text, keep.source = FALSE, srcfile = NULL)[[1L]] + + # construct map between source strings, replaced strings + map <- as.character(parse(text = strings)) + names(map) <- as.character(parse(text = replacements)) + + # convert to list + map <- as.list(map) + + # remap strings in object + remapped <- renv_json_read_remap(json, map) + + # evaluate + eval(remapped, envir = baseenv()) + + } + + renv_json_read_remap <- function(json, map) { + + # fix names + if (!is.null(names(json))) { + lhs <- match(names(json), names(map), nomatch = 0L) + rhs <- match(names(map), names(json), nomatch = 0L) + names(json)[rhs] <- map[lhs] + } + + # fix values + if (is.character(json)) + return(map[[json]] %||% json) + + # handle true, false, null + if (is.name(json)) { + text <- as.character(json) + if (text == "true") + return(TRUE) + else if (text == "false") + return(FALSE) + else if (text == "null") + return(NULL) + } + + # recurse + if (is.recursive(json)) { + for (i in seq_along(json)) { + json[i] <- list(renv_json_read_remap(json[[i]], map)) + } + } + + json + + } + + # load the renv profile, if any + renv_bootstrap_profile_load(project) + + # construct path to library root + root <- renv_bootstrap_library_root(project) + + # construct library prefix for platform + prefix <- renv_bootstrap_platform_prefix() + + # construct full libpath + libpath <- file.path(root, prefix) + + # run bootstrap code + renv_bootstrap_exec(project, libpath, version) + + invisible() + +}) diff --git a/tests/testthat/test-confirmatoryfactoranalysis.R b/tests/testthat/test-confirmatoryfactoranalysis.R index 88406a8b..1f408dcf 100644 --- a/tests/testthat/test-confirmatoryfactoranalysis.R +++ b/tests/testthat/test-confirmatoryfactoranalysis.R @@ -20,7 +20,7 @@ options$bartlettTest <- TRUE set.seed(1) -results <- jaspTools::runAnalysis("confirmatoryFactorAnalysis", "holzingerswineford.csv", options) +results <- jaspTools::runAnalysis("confirmatoryFactorAnalysis", testthat::test_path("holzingerswineford.csv"), options) test_that("[CFA 3-Factor] Factor Covariances table results match", { @@ -714,3 +714,39 @@ test_that("Intercepts table results match", { "x9", 0.0190291696997005, 0.600891884514286, -2.34495904524032 )) }) + + +# covariance matrix input +# 3-factor run + +options <- jaspTools::analysisOptions("confirmatoryFactorAnalysis") +options$group <- "" +options$invarianceTesting <- "configural" +options$packageMimiced <- "lavaan" +options$seType <- "standard" +options$estimator <- "default" +options$standardized <- "none" +options$factors <- list( + list(indicators = list("x1", "x2", "x3"), name = "Factor1", title = "Factor 1", types = rep("scale", 3)), + list(indicators = list("x4", "x5", "x6"), name = "Factor2", title = "Factor 2", types = rep("scale", 3)), + list(indicators = list("x7", "x8", "x9"), name = "Factor3", title = "Factor 3", types = rep("scale", 3)) +) +options$modelIdentification <- "factorVariance" +options$naAction <- "listwise" +options$dataType <- "varianceCovariance" +options$sampleSize <- 300 + +dt <- read.csv(testthat::test_path("holzingerswineford.csv")) +covMatrix <- cov(dt[, c("x1", "x2", "x3", "x4", "x5", "x6", "x7", "x8", "x9")]) +covMatrix <- as.data.frame(covMatrix) + +set.seed(1) +results <- jaspTools::runAnalysis("confirmatoryFactorAnalysis", covMatrix, options, makeTests = F) + + +test_that("Chi-square test table results match", { + table <- results[["results"]][["maincontainer"]][["collection"]][["maincontainer_cfatab"]][["data"]] + jaspTools::expect_equal_tables(table, + list(915.798926205035, 36, "Baseline model", "", 85.0221147234242, + 24, "Factor model", 9.45493439097334e-09)) +}) diff --git a/tests/testthat/test-exploratoryfactoranalysis.R b/tests/testthat/test-exploratoryfactoranalysis.R index f7424fd9..8d197d35 100644 --- a/tests/testthat/test-exploratoryfactoranalysis.R +++ b/tests/testthat/test-exploratoryfactoranalysis.R @@ -310,3 +310,69 @@ test_that("Parallel Analysis table results match", { 0.676364280574212)) }) + +# variance covariance matrix input +dt <- read.csv(testthat::test_path("holzingerswineford.csv")) +cdt <- as.data.frame(cov(dt[, 7:15])) +options <- list( + addScores = FALSE, + addedScoresPrefix = "FA", + analysisBasedOn = "correlationMatrix", + bartlettTest = FALSE, + dataType = "varianceCovariance", + eigenValuesAbove = 1, + factorCorrelations = FALSE, + factorCountMethod = "manual", + factorLoadingsOrder = "sortByVariables", + factorStructure = FALSE, + factoringMethod = "minimumResidual", + fitIndices = FALSE, + kaiserMeyerOlkinTest = FALSE, + loadingsDisplayLimit = 0.1, + manualNumberOfFactors = 1, + mardiaTest = FALSE, + naAction = "pairwise", + obliqueSelector = "promax", + orthogonalSelector = "none", + parallelAnalysisMethod = "principalComponentBased", + parallelAnalysisSeed = 1234, + parallelAnalysisTable = FALSE, + parallelAnalysisTableMethod = "principalComponentBased", + pathDiagram = FALSE, + plotHeight = 320, + plotWidth = 480, + residualMatrix = FALSE, + rotationMethod = "orthogonal", + sampleSize = 200, + screePlot = FALSE, + screePlotParallelAnalysisResults = TRUE, + variables = c("x1", "x2", "x3", "x4", "x5", "x6", "x7", "x8", "x9") +) + +set.seed(1) +results <- runAnalysis("exploratoryFactorAnalysis", cdt, options, makeTests = F) + +test_that("Factor Characteristics table results match", { + table <- results[["results"]][["modelContainer"]][["collection"]][["modelContainer_eigenTable"]][["data"]] + jaspTools::expect_equal_tables(table, + list("Factor 1", 0.292468690109419, 3.21634418143771, 0.292468690109419, + 2.63221821098477)) +}) + +test_that("Chi-squared Test table results match", { + table <- results[["results"]][["modelContainer"]][["collection"]][["modelContainer_goodnessOfFitTable"]][["data"]] + jaspTools::expect_equal_tables(table, + list(235.832782509408, 27, "Model", 3.1571356942318e-35)) +}) + +test_that("Factor Loadings table results match", { + table <- results[["results"]][["modelContainer"]][["collection"]][["modelContainer_loadingsTable"]][["data"]] + jaspTools::expect_equal_tables(table, + list(0.558950485489651, 0.687574354770883, "x1", 0.30045377286727, + 0.909727530369823, "x2", 0.365159382803395, 0.866658625150644, + "x3", 0.761746187230209, 0.41974274624024, "x4", 0.723809404128654, + 0.476099946494923, "x5", 0.768996689601407, 0.408644091382077, + "x6", 0.25910333096785, 0.932865463881365, "x7", 0.339140545375525, + 0.884983690482392, "x8", 0.467453266437421, 0.781487443696986, + "x9")) +}) diff --git a/tests/testthat/test-principalcomponentanalysis.R b/tests/testthat/test-principalcomponentanalysis.R index c1f6878e..e46ab0f3 100644 --- a/tests/testthat/test-principalcomponentanalysis.R +++ b/tests/testthat/test-principalcomponentanalysis.R @@ -340,3 +340,67 @@ test_that("Parallel Analysis table results match", { 0.696170865182367, 0.806896345892467, "Component 6", 0.305503359590833, 0.676364280574212)) }) + + +# variance covariance matrix input +dt <- read.csv(testthat::test_path("holzingerswineford.csv")) +cdt <- as.data.frame(cov(dt[, 7:15])) +options <- list( + addScores = FALSE, + addedScoresPrefix = "PC", + analysisBasedOn = "correlationMatrix", + bartlettTest = FALSE, + componentCorrelations = FALSE, + componentCountMethod = "manual", + componentLoadingsOrder = "sortByVariables", + dataType = "varianceCovariance", + eigenValuesAbove = 1, + kaiserMeyerOlkinTest = FALSE, + loadingsDisplayLimit = 0.1, + manualNumberOfComponents = 1, + mardiaTest = FALSE, + naAction = "pairwise", + obliqueSelector = "promax", + orthogonalSelector = "none", + parallelAnalysisMethod = "principalComponentBased", + parallelAnalysisSeed = 1234, + parallelAnalysisTable = FALSE, + parallelAnalysisTableMethod = "principalComponentBased", + pathDiagram = FALSE, + plotHeight = 320, + plotWidth = 480, + residualMatrix = FALSE, + rotationMethod = "orthogonal", + sampleSize = 200, + screePlot = FALSE, + screePlotParallelAnalysisResults = TRUE, + variables = c("x1", "x2", "x3", "x4", "x5", "x6", "x7", "x8", "x9") +) + +set.seed(1) +results <- runAnalysis("principalComponentAnalysis", cdt, options, makeTests = F) + +test_that("Component Characteristics table results match", { + table <- results[["results"]][["modelContainer"]][["collection"]][["modelContainer_eigenTable"]][["data"]] + jaspTools::expect_equal_tables(table, + list("Component 1", 0.357371575715301, 3.2163441814377, 0.357371575715301 + )) +}) + +test_that("Chi-squared Test table results match", { + table <- results[["results"]][["modelContainer"]][["collection"]][["modelContainer_goodnessOfFitTable"]][["data"]] + jaspTools::expect_equal_tables(table, + list(268.944880177337, 27, "Model", 1.0379031932901e-41)) +}) + +test_that("Component Loadings table results match", { + table <- results[["results"]][["modelContainer"]][["collection"]][["modelContainer_loadingsTable"]][["data"]] + jaspTools::expect_equal_tables(table, + list(0.658301970425138, 0.566638515734381, "x1", 0.389685299082607, + 0.848145367678899, "x2", 0.477040613001908, 0.772432253546763, + "x3", 0.765811755326015, 0.413532355404489, "x4", 0.737544154070493, + 0.456028620796441, "x5", 0.772162747894139, 0.403764690764573, + "x6", 0.348796474669525, 0.878341019258111, "x7", 0.454247183933516, + 0.793659495888471, "x8", 0.590666149791766, 0.651113499490171, + "x9")) +})