diff --git a/DESCRIPTION b/DESCRIPTION index 79a4946f..d87c9a22 100644 --- a/DESCRIPTION +++ b/DESCRIPTION @@ -1,7 +1,7 @@ Package: CVXR Type: Package Title: Disciplined Convex Optimization -Version: 1.0-14 +Version: 1.0-15 VignetteBuilder: knitr Authors@R: c( person("Anqi", "Fu", @@ -42,7 +42,6 @@ Depends: R (>= 3.4.0) Imports: methods, - R6, Matrix, Rcpp (>= 0.12.12), bit64, @@ -52,7 +51,8 @@ Imports: scs (>= 3.0), stats, osqp, - clarabel (>= 0.9.0) + cli, + utils Suggests: knitr, rmarkdown, @@ -92,19 +92,17 @@ Collate: 'qp2quad_form.R' 'qp_solvers.R' 'utilities.R' + 'coll_utils.R' 'solver_utilities.R' 'transforms.R' 'exports.R' 'rcppUtils.R' - 'R6List.R' - 'ProblemData-R6.R' - 'LinOp-R6.R' - 'LinOpVector-R6.R' + 'LinOp.R' + 'LinOpVector.R' 'RcppExports.R' - 'CVXcanon-R6.R' - 'Deque.R' + 'CVXcanon.R' 'canonInterface.R' -RoxygenNote: 7.3.1 +RoxygenNote: 7.3.2 Encoding: UTF-8 Enhances: Rcplex, @@ -112,4 +110,5 @@ Enhances: rcbc, cccp, Rmosek, - Rglpk + Rglpk, + clarabel (>= 0.9.0) diff --git a/NAMESPACE b/NAMESPACE index a8d17e5b..a9419552 100755 --- a/NAMESPACE +++ b/NAMESPACE @@ -3,6 +3,7 @@ S3method(max,Expression) S3method(mean,Expression) S3method(min,Expression) +S3method(print,cvxr_result) S3method(prod,Expression) S3method(sum,Expression) S3method(t,Expression) @@ -207,12 +208,12 @@ import(Matrix) import(methods) importClassesFrom(gmp,bigq) importClassesFrom(gmp,bigz) -importFrom(R6,R6Class) importFrom(Rcpp,evalCpp) importFrom(Rmpfr,getPrec) importFrom(Rmpfr,mpfr) importFrom(bit64,as.bitstring) importFrom(bit64,as.integer64) +importFrom(cli,cli_bullets) importFrom(gmp,as.bigq) importFrom(gmp,as.bigz) importFrom(gmp,asNumeric) diff --git a/NEWS.md b/NEWS.md index e380509c..f642b2ae 100644 --- a/NEWS.md +++ b/NEWS.md @@ -1,3 +1,15 @@ +# CVXR 1.0-15 + +* Revert `clarabel` requirement and use enhance rather than import + until really necessary ([Issue + 142](https://github.com/cvxgrp/CVXR/issues/142)). +* Update return codes for `user_limit` etc to be + `infeasible_inaccurate` to match [`CVXPY` for gurobi](https://github.com/cvxpy/cvxpy/pull/1270) +* Add an S3 print method for result from `solve()`. +* Move `upper_tri_to_full` to C++ +* Drop use of R6 classes +* Address bug in copying `Power` object ([Issue 145](https://github.com/cvxgrp/CVXR/issues/142)). + # CVXR 1.0-14 * Address further inefficiency in use of diagonal matrices in diff --git a/R/CVXcanon-R6.R b/R/CVXcanon-R6.R deleted file mode 100755 index 298bab40..00000000 --- a/R/CVXcanon-R6.R +++ /dev/null @@ -1,44 +0,0 @@ -## CVXcanon class shadowing CVXcannon.cpp code, exposing merely the two -## build_matrix methods -CVXcanon <- R6::R6Class("CVXcanon", - private = list( - ptr = NA - ) - , - active = list( - ) - , - public = list( - initialize = function() { - } - , - getXPtr = function() { - private$ptr - } - , - build_matrix = function(constraints, id_to_col, constr_offsets) { - ## constraints is a vector of Linops (LinOpVector-R6 in R) - ## id_to_col is an integer vector with names that are - ## integers converted to chacracters - ## constr_offsets is a standard integer vector in R - ## cat("Linvec\n") - ## constraints$print() - ## cat("id_to_col\n") - ## print(id_to_col) - - if (missing(constr_offsets)) { - objPtr <- .Call('_CVXR_build_matrix_0', - constraints$getXPtr(), - id_to_col, - PACKAGE = 'CVXR') - } else { - objPtr <- .Call('_CVXR_build_matrix_1', - constraints$getXPtr(), - id_to_col, - constr_offsets, - PACKAGE = 'CVXR') - } - ##cat("Instantiating ProblemData-R6", "\n") - CVXcanon.ProblemData$new(objPtr) - } - )) diff --git a/R/CVXcanon.R b/R/CVXcanon.R new file mode 100755 index 00000000..acfb2240 --- /dev/null +++ b/R/CVXcanon.R @@ -0,0 +1,33 @@ + +CVXcanon.build_matrix <- function(constraints, id_to_col, constr_offsets) { + ## Returns a ProblemData object + ptr <- NA + if (missing(constr_offsets)) { + ptr <- .Call('_CVXR_build_matrix_0', + constraints$getXPtr(), + id_to_col, + PACKAGE = 'CVXR') + } else { + ptr <- .Call('_CVXR_build_matrix_1', + constraints$getXPtr(), + id_to_col, + constr_offsets, + PACKAGE = 'CVXR') + } + getV <- function() { + .Call('_CVXR_ProblemData__get_V', ptr, PACKAGE = "CVXR") + } + + getI <- function() { + .Call('_CVXR_ProblemData__get_I', ptr, PACKAGE = "CVXR") + } + + getJ <- function() { + .Call('_CVXR_ProblemData__get_J', ptr, PACKAGE = "CVXR") + } + + getConstVec <- function() { + .Call('_CVXR_ProblemData__get_const_vec', ptr, PACKAGE = "CVXR") + } + list(getV = getV, getI = getI, getJ = getJ, getConstVec = getConstVec) +} diff --git a/R/Deque.R b/R/Deque.R deleted file mode 100755 index bae4579c..00000000 --- a/R/Deque.R +++ /dev/null @@ -1,35 +0,0 @@ -Deque <- R6::R6Class("Deque", - private = list( - queue = NA - ), - public = list( - initialize = function(init = list()) { - private$queue <- init - }, - ## popleft, remove and return an element from the left side of the queue, - ## raise error if no element. - popleft = function() { - if (length(private$queue) > 0) { - result <- private$queue[[1]] - private$queue <- private$queue[-1] - result - } else { - stop("Deque: empty queue") - } - }, - ## append, adds to the right end of the queue - ## - append = function(what) { - n <- length(private$queue) - private$queue[[n+1]] <- what - invisible(private$queue) - }, - length = function() { - length(private$queue) - }, - getQ = function() private$queue, - print = function() { - print(private$queue) - } - )) - diff --git a/R/LinOp-R6.R b/R/LinOp-R6.R deleted file mode 100755 index 354fc4a0..00000000 --- a/R/LinOp-R6.R +++ /dev/null @@ -1,157 +0,0 @@ -## LinOp class shadowing CPP class -CVXcanon.LinOp <- R6::R6Class("CVXcanon.LinOp", - private = list( - operatorType = c( ## from LinOp.hpp - "VARIABLE", - "PROMOTE", - "MUL_EXPR", - "RMUL_EXPR", - "MUL_ELEM", - "DIV", - "SUM", - "NEG", - "INDEX", - "TRANSPOSE", - "SUM_ENTRIES", - "TRACE", - "RESHAPE_EXPR", - "DIAG_VEC", - "DIAG_MAT", - "UPPER_TRI", - "CONV", - "HSTACK", - "VSTACK", - "SCALAR_CONST", - "DENSE_CONST", - "SPARSE_CONST", - "NO_OP", - "KRON"), - args = NA, - ptr = NA - ), - active = list( - sparse = function(value) { - if (missing(value)) { - .Call("_CVXR_LinOp__get_sparse", private$ptr, PACKAGE = "CVXR") - } else { - ## value should be a boolean - .Call("_CVXR_LinOp__set_sparse", private$ptr, value, PACKAGE = "CVXR") - } - } - , - sparse_data = function(value) { - if (missing(value)) { - .Call("_CVXR_LinOp__get_sparse_data", private$ptr, PACKAGE = "CVXR") - } else { - ## value should be a dgCMatrix-class - .Call("_CVXR_LinOp__set_sparse_data", private$ptr, value, PACKAGE = "CVXR") - } - } - , - dense_data = function(value) { - if (missing(value)) { - .Call("_CVXR_LinOp__get_dense_data", private$ptr, PACKAGE = "CVXR") - } else { - ## value should be a matrix - .Call("_CVXR_LinOp__set_dense_data", private$ptr, value, PACKAGE = "CVXR") - } - } - , - type = function(value) { - if (missing(value)) { - index <- .Call("_CVXR_LinOp__get_type", private$ptr, PACKAGE = "CVXR") - ## make 1-based index - private$operatorType[index + 1] - } else { - ##value <- match.arg(value, private$operatorType) - ## Make zero based index! - index <- match(value, private$operatorType) - 1 - .Call("_CVXR_LinOp__set_type", private$ptr, index, PACKAGE = "CVXR") - } - } - , - size = function(value) { - if (missing(value)) { - .Call("_CVXR_LinOp__get_size", private$ptr, PACKAGE = "CVXR") - } else { - ## value is an integer vector - .Call("_CVXR_LinOp__set_size", private$ptr, value, PACKAGE = "CVXR") - } - } - , - slice = function(value) { - if (missing(value)) { - .Call("_CVXR_LinOp__get_slice", private$ptr, PACKAGE = "CVXR") - } else { - ## value is a list of integer vectors - .Call("_CVXR_LinOp__set_slice", private$ptr, value, PACKAGE = "CVXR") - } - } - ), - public = list( - initialize = function(type = NULL, size = NULL, args = NULL, data = NULL) { - private$args = R6List$new() - ## Create a new LinOp on the C side - private$ptr <- .Call("_CVXR_LinOp__new", PACKAGE = "CVXR") - ## Associate args on R side with the args on the C side. - if (!is.null(type)) { - self$type <- type - } - if (!is.null(size)) { - self$size <- size - } - if (!is.null(args)) { - for (x in args) self$args_push_back(x) - } - if (!is.null(data)) { - self$dense_data <- data - } - } - , - args_push_back = function(R6LinOp) { - private$args$append(R6LinOp) - .Call("_CVXR_LinOp__args_push_back", private$ptr, R6LinOp$getXPtr(), PACKAGE = "CVXR") - } - , - slice_push_back = function(anIntVector) { - .Call("_CVXR_LinOp__slice_push_back", private$ptr, - anIntVector, PACKAGE = "CVXR") - } - , - getXPtr = function() { - private$ptr - } - , - getArgs = function() { - private$args - } - , - get_id = function() { - .Call("_CVXR_LinOp__get_id", private$ptr, PACKAGE = "CVXR") - } - , - size_push_back = function(value) { - .Call("_CVXR_LinOp__size_push_back", private$ptr, value, PACKAGE = "CVXR") - } - , - toString = function() { - sparse <- self$sparse - if (sparse) { - data <- paste(self$sparse_data, collapse=", ") - } else { - data <- paste(self$dense_data, collapse=", ") - } - sprintf("LinOp(id=%s, type=%s, size=[%s], args=%s, sparse=%s, data=[%s])", - self$get_id(), - self$type, - paste(self$size, collapse=", "), - private$args$toString(), - sparse, - data) - } - , - print = function() { - print(self$toString()) - } - - )) diff --git a/R/LinOp.R b/R/LinOp.R new file mode 100755 index 00000000..90fbf4b6 --- /dev/null +++ b/R/LinOp.R @@ -0,0 +1,111 @@ +## LinOp class shadowing CPP class +CVXcanon.LinOp <- function(type = NULL, size = NULL, args = NULL, data = NULL) { + operatorType <- c( + "VARIABLE", + "PROMOTE", + "MUL_EXPR", + "RMUL_EXPR", + "MUL_ELEM", + "DIV", + "SUM", + "NEG", + "INDEX", + "TRANSPOSE", + "SUM_ENTRIES", + "TRACE", + "RESHAPE_EXPR", + "DIAG_VEC", + "DIAG_MAT", + "UPPER_TRI", + "CONV", + "HSTACK", + "VSTACK", + "SCALAR_CONST", + "DENSE_CONST", + "SPARSE_CONST", + "NO_OP", + "KRON") + ## Create a new LinOp on the C side + ptr <- .Call("_CVXR_LinOp__new", PACKAGE = "CVXR") + + getXPtr <- function() ptr + + ## Associate args on R side with the args on the C side. + if (!is.null(type)) { + set_type(type) + } + + if (!is.null(size)) { + set_size(size) + } + + ## make a direct call for efficiency rather than calling self$args_push_back(x) + for (x in args) .Call("_CVXR_LinOp__args_push_back", ptr, x$getXPtr(), PACKAGE = "CVXR") + + if (!is.null(data)) { + set_dense_data(data) + } + + set_sparse <- function(value) .Call("_CVXR_LinOp__set_sparse", ptr, value, PACKAGE = "CVXR") + get_sparse <- function() .Call("_CVXR_LinOp__get_sparse", ptr, PACKAGE = "CVXR") + set_sparse_data <- function(value) .Call("_CVXR_LinOp__set_sparse_data", ptr, value, PACKAGE = "CVXR") + get_sparse_data <- function() .Call("_CVXR_LinOp__get_sparse_data", ptr, PACKAGE = "CVXR") + set_dense_data <- function(value) .Call("_CVXR_LinOp__set_dense_data", ptr, value, PACKAGE = "CVXR") + get_dense_data <- function() .Call("_CVXR_LinOp__get_dense_data", ptr, PACKAGE = "CVXR") + set_type <- function(value) { + ##value <- match.arg(value, operatorType) + ## Make zero based index! + index <- match(value, operatorType) - 1L + .Call("_CVXR_LinOp__set_type", ptr, index, PACKAGE = "CVXR") + } + get_type <- function() { + index <- .Call("_CVXR_LinOp__get_type", ptr, PACKAGE = "CVXR") + operatorType[index + 1L] + } + set_size <- function(value) .Call("_CVXR_LinOp__set_size", ptr, value, PACKAGE = "CVXR") + get_size <- function() .Call("_CVXR_LinOp__get_size", ptr, PACKAGE = "CVXR") + set_slice <- function(value) .Call("_CVXR_LinOp__set_slice", ptr, value, PACKAGE = "CVXR") + get_slice <- function() .Call("_CVXR_LinOp__get_slice", ptr, PACKAGE = "CVXR") + args_push_back <- function(linOp) .Call("_CVXR_LinOp__args_push_back", ptr, linOp$getXPtr(), PACKAGE = "CVXR") + slice_push_back <- function(intVector) .Call("_CVXR_LinOp__slice_push_back", ptr, intVector, PACKAGE = "CVXR") + getArgs <- function() args + get_id <- function() .Call("_CVXR_LinOp__get_id", ptr, PACKAGE = "CVXR") + size_push_back <- function(value) .Call("_CVXR_LinOp__size_push_back", ptr, value, PACKAGE = "CVXR") + toString <- function() { + sparse <- get_sparse() + if (sparse) { + data <- paste(get_sparse_data(), collapse=", ") + } else { + data <- paste(get_dense_data(), collapse=", ") + } + sprintf("LinOp(id=%s, type=%s, size=[%s], args=%s, sparse=%s, data=[%s])", + get_id(), + get_type(), + paste(get_size(), collapse=", "), + args$toString(), + sparse, + data) + } + print <- function() print(toString()) + + list(getXPtr = getXPtr, + set_sparse = set_sparse, + get_sparse = get_sparse, + set_sparse_data = set_sparse_data, + get_sparse_data = get_sparse_data, + set_dense_data = set_dense_data, + get_dense_data = get_dense_data, + set_type = set_type, + get_type = get_type, + set_size = set_size, + get_size = get_size, + set_slice = set_slice, + get_slice = get_slice, + args_push_back = args_push_back, + slice_push_back = slice_push_back, + getArgs = getArgs, + get_id = get_id, + size_push_back = size_push_back, + toString = toString, + print = print) +} diff --git a/R/LinOpVector-R6.R b/R/LinOpVector-R6.R deleted file mode 100755 index 4a6f745b..00000000 --- a/R/LinOpVector-R6.R +++ /dev/null @@ -1,40 +0,0 @@ -## LinOpVector class shadowing CPP class -CVXcanon.LinOpVector <- R6::R6Class("CVXcanon.LinOpVector", - private = list( - linOps = NA, - ptr = NA ## the rcpp XPtr - ), - active = list( - ), - public = list( - initialize = function() { - private$linOps <- list() - private$ptr <- .Call("_CVXR_LinOpVector__new", PACKAGE = "CVXR") - } - , - getXPtr = function() { - private$ptr - } - , - getList = function() { - private$linOps - } - , - push_back = function(R6LinOp) { - n <- length(private$linOps) - private$linOps[[n+1]] <- R6LinOp - ## Needs modification by hand for arguments - .Call("_CVXR_LinOpVector__push_back", private$ptr , R6LinOp$getXPtr(), PACKAGE = "CVXR") - } - , - toString = function() { - result <- sapply(private$linOps, function(x) x$toString()) - result <- paste(result, collapse = ", ") - sprintf("[ %s ]", result) - } - , - print = function() { - print(self$toString()) - } - - )) diff --git a/R/LinOpVector.R b/R/LinOpVector.R new file mode 100755 index 00000000..4f3fe8a9 --- /dev/null +++ b/R/LinOpVector.R @@ -0,0 +1,24 @@ +## LinOpVector class shadowing CPP class +CVXcanon.LinOpVector <- function() { + linOps <- list() + ptr <- .Call("_CVXR_LinOpVector__new", PACKAGE = "CVXR") + getXPtr <- function() ptr + getList <- function() linOps + push_back <- function(linOp) { + n <- length(linOps) + linOps[[n + 1L]] <- linOp + ## Needs modification by hand for arguments + .Call("_CVXR_LinOpVector__push_back", ptr , linOp$getXPtr(), PACKAGE = "CVXR") + } + toString <- function() { + result <- sapply(linOps, function(x) x$toString()) + result <- paste(result, collapse = ", ") + sprintf("[ %s ]", result) + } + print <- function() print(toString()) + list(getXPtr = getXPtr, + getList = getList, + push_back = push_back, + toString = toString, + print = print) +} diff --git a/R/ProblemData-R6.R b/R/ProblemData-R6.R deleted file mode 100755 index d9fcf9ad..00000000 --- a/R/ProblemData-R6.R +++ /dev/null @@ -1,80 +0,0 @@ -## CVXcanon.ProblemData class shadowing CPP class -CVXcanon.ProblemData <- R6::R6Class("CVXcanon.ProblemData", - private = list( - ptr = NA - ), - active = list( - V = function(value) { - if (missing(value)) { - .Call('_CVXR_ProblemData__get_V', private$ptr, PACKAGE = "CVXR") - } else { - .Call('_CVXR_ProblemData__set_V', private$ptr, value, PACKAGE = "CVXR") - } - } - , - I = function(value) { - if (missing(value)) { - .Call('_CVXR_ProblemData__get_I', private$ptr, PACKAGE = "CVXR") - } else { - .Call('_CVXR_ProblemData__set_I', private$ptr, value, PACKAGE = "CVXR") - } - } - , - J = function(value) { - if (missing(value)) { - .Call('_CVXR_ProblemData__get_J', private$ptr, PACKAGE = "CVXR") - } else { - .Call('_CVXR_ProblemData__set_J', private$ptr, value, PACKAGE = "CVXR") - } - } - , - const_vec = function(value) { - if (missing(value)) { - .Call('_CVXR_ProblemData__get_const_vec', private$ptr, PACKAGE = "CVXR") - } else { - .Call('_CVXR_ProblemData__set_const_vec', private$ptr, value, PACKAGE = "CVXR") - } - } - , - id_to_col = function(value) { - if (missing(value)) { - .Call('_CVXR_ProblemData__get_id_to_col', private$ptr, PACKAGE = "CVXR") - - } else { - .Call('_CVXR_ProblemData__set_id_to_col', private$ptr, value, PACKAGE = "CVXR") - } - } - , - const_to_row = function(value) { - if (missing(value)) { - .Call('_CVXR_ProblemData__get_const_to_row', private$ptr, PACKAGE = "CVXR") - } else { - .Call('_CVXR_ProblemData__set_const_to_row', private$ptr, value, PACKAGE = "CVXR") - } - } - ), - public = list( - initialize = function(ptr = NULL) { - private$ptr <- if (is.null(ptr)) { - .Call('_CVXR_ProblemData__new', PACKAGE = 'CVXR') - } else { - ptr - } - } - , - getV = function() { - .Call('_CVXR_ProblemData__get_V', private$ptr, PACKAGE = "CVXR") - } - , - getI = function() { - .Call('_CVXR_ProblemData__get_I', private$ptr, PACKAGE = "CVXR") - } - , - getJ = function() { - .Call('_CVXR_ProblemData__get_J', private$ptr, PACKAGE = "CVXR") - } - , - getConstVec = function() { - .Call('_CVXR_ProblemData__get_const_vec', private$ptr, PACKAGE = "CVXR") - } - )) diff --git a/R/R6List.R b/R/R6List.R deleted file mode 100755 index 89093423..00000000 --- a/R/R6List.R +++ /dev/null @@ -1,31 +0,0 @@ -## An R6 List class with reference semantics mainly for keeping objects in scope -#' @importFrom R6 R6Class -R6List <- R6::R6Class("R6List", - private = list( - r6list = NA - ) - , - public = list( - initialize = function() { - private$r6list <- list() - } - , - getList = function() { - private$r6list - } - , - append = function(what) { - n <- length(private$r6list) - private$r6list[[n+1]] <- what - } - , - toString = function() { - result <- sapply(private$r6list, function(x) x$toString()) - result <- paste(result, collapse = ", ") - sprintf("[ %s ]", result) - } - , - print = function() { - print(self$toString()) - } - )) diff --git a/R/RcppExports.R b/R/RcppExports.R index f669ba9e..4e594190 100644 --- a/R/RcppExports.R +++ b/R/RcppExports.R @@ -32,6 +32,10 @@ invisible(.Call('_CVXR_sweep_in_place', PACKAGE = 'CVXR', P, c_part)) } +upper_tri_to_full <- function(n) { + .Call('_CVXR_upper_tri_to_full', PACKAGE = 'CVXR', n) +} + #' Create a new LinOp object. #' #' @return an external ptr (Rcpp::XPtr) to a LinOp object instance. diff --git a/R/canonInterface.R b/R/canonInterface.R index 7a154f90..5431d7cb 100755 --- a/R/canonInterface.R +++ b/R/canonInterface.R @@ -1,7 +1,7 @@ ## Added format_matrix and set_matrix_data. get_problem_matrix <- function(linOps, id_to_col = integer(0), constr_offsets = integer(0)) { - cvxCanon <- CVXcanon$new() - lin_vec <- CVXcanon.LinOpVector$new() + ## cvxCanon <- CVXcanon$new() + lin_vec <- CVXcanon.LinOpVector() ## KLUDGE: Anqi, fix id_to_col to have proper names! # if (is.null(names(id_to_col))) names(id_to_col) <- unlist(id_to_col) @@ -22,12 +22,12 @@ get_problem_matrix <- function(linOps, id_to_col = integer(0), constr_offsets = ## id_to_col_C$map(key = as.integer(id), value = as.integer(col)) ## } - ## This array keeps variables data in scope after build_lin_op_tree returns - tmp <- R6List$new() + ## tmp is a vector that keeps variables data in scope after build_lin_op_tree returns + tmp <- make_vec() for (lin in linOps) { - tree <- build_lin_op_tree(lin, tmp) - tmp$append(tree) - lin_vec$push_back(tree) + tree <- build_lin_op_tree(lin, tmp) + tmp$push_back(tree) + lin_vec$push_back(tree) } ## REMOVE this later when we are sure @@ -36,7 +36,7 @@ get_problem_matrix <- function(linOps, id_to_col = integer(0), constr_offsets = } if (length(constr_offsets) == 0) - problemData <- cvxCanon$build_matrix(lin_vec, id_to_col_C) + problemData <- CVXcanon.build_matrix(lin_vec, id_to_col_C) else { ## Load constraint offsets into a C++ vector ##constr_offsets_C <- CVXCanon.IntVector$new() @@ -44,7 +44,7 @@ get_problem_matrix <- function(linOps, id_to_col = integer(0), constr_offsets = ## constr_offsets_C$push_back(as.integer(offset)) constr_offsets_C <- constr_offsets storage.mode(constr_offsets_C) <- "integer" - problemData <- cvxCanon$build_matrix(lin_vec, id_to_col_C, constr_offsets_C) + problemData <- CVXcanon.build_matrix(lin_vec, id_to_col_C, constr_offsets_C) } ## Unpacking @@ -88,17 +88,17 @@ set_matrix_data <- function(linC, linR) { if (is.list(linR$data) && linR$data$class == "LinOp") { if (linR$data$type == 'sparse_const') { - linC$sparse_data <- format_matrix(linR$data$data, 'sparse') + linC$set_sparse_data(format_matrix(linR$data$data, 'sparse')) } else if (linR$data$type == 'dense_const') { - linC$dense_data <- format_matrix(linR$data$data) + linC$set_dense_data(format_matrix(linR$data$data)) } else { stop(sprintf("set_matrix_data: data.type %s unknown", linR$data$type)) } } else { if (linR$type == 'sparse_const') { - linC$sparse_data <- format_matrix(linR$data, 'sparse') + linC$set_sparse_data(format_matrix(linR$data, 'sparse')) } else { - linC$dense_data <- format_matrix(linR$data) + linC$set_dense_data(format_matrix(linR$data)) } } } @@ -146,27 +146,27 @@ set_slice_data <- function(linC, linR) { ## What does this do? } build_lin_op_tree <- function(root_linR, tmp, verbose = FALSE) { - Q <- Deque$new() - root_linC <- CVXcanon.LinOp$new() - Q$append(list(linR = root_linR, linC = root_linC)) + Q <- make_vec() ## A deque + root_linC <- CVXcanon.LinOp() + Q$push_back(list(linR = root_linR, linC = root_linC)) - while(Q$length() > 0) { - node <- Q$popleft() + while(Q$size() > 0) { + node <- Q$pop_front() ## deque pop_front operation linR <- node$linR linC <- node$linC ## Updating the arguments our LinOp - ## tmp is a list + ## tmp is a vector with reference semantics for(argR in linR$args) { - tree <- CVXcanon.LinOp$new() - tmp$append(tree) - Q$append(list(linR = argR, linC = tree)) + tree <- CVXcanon.LinOp() + tmp$push_back(tree) + Q$push_back(list(linR = argR, linC = tree)) linC$args_push_back(tree) } ## Setting the type of our LinOp; at the C level, it is an ENUM! ## Can we avoid this case conversion and use UPPER CASE to match C? - linC$type <- toupper(linR$type) ## Check with Anqi + linC$set_type(toupper(linR$type)) ## Check with Anqi ## Setting size linC$size_push_back(as.integer(linR$dim[1])) @@ -179,9 +179,9 @@ build_lin_op_tree <- function(root_linR, tmp, verbose = FALSE) { ## ASK Anqi about this set_slice_data(linC, linR) ## TODO } else if(is.numeric(linR$data) || is.integer(linR$data)) - linC$dense_data <- format_matrix(linR$data, 'scalar') + linC$set_dense_data(format_matrix(linR$data, 'scalar')) else if(linR$data$class == 'LinOp' && linR$data$type == 'scalar_const') - linC$dense_data <- format_matrix(linR$data$data, 'scalar') + linC$set_dense_data(format_matrix(linR$data$data, 'scalar')) else set_matrix_data(linC, linR) } diff --git a/R/clarabel.R b/R/clarabel.R index 57c8a65c..f8f8e7f1 100644 --- a/R/clarabel.R +++ b/R/clarabel.R @@ -48,8 +48,10 @@ setMethod("status_map", "CLARABEL", function(solver, status) { setMethod("name", "CLARABEL", function(x) { CLARABEL_NAME }) #' @describeIn CLARABEL Imports the solver -## Since CLARABEL is required, this is always TRUE -setMethod("import_solver", "CLARABEL", function(solver) { TRUE }) +## Since CLARABEL is now optional, we check if it is available +setMethod("import_solver", "CLARABEL", function(solver) { + requireNamespace("clarabel", quietly = TRUE) +}) #' @param problem A \linkS4class{Problem} object. #' @param constr A \linkS4class{Constraint} to format. diff --git a/R/coll_utils.R b/R/coll_utils.R new file mode 100644 index 00000000..bea9a0be --- /dev/null +++ b/R/coll_utils.R @@ -0,0 +1,14 @@ +#### #' Create a vec using a list +#### #' @return a list that provides a vector as well as a deque +make_vec <- function() { + vec <- vector(mode = "list", length = 29L) ## initial length of 29! + n <- 0L + push_back <- function(what) { n <<- n + 1L; vec[[n]] <<- what; invisible(what) } + push_front <- function(what) { vec <<- append(list(what), vec); n <<- n + 1L; invisible(what) } + pop_back <- function() { result <- vec[[n]]; vec[[n]] <<- NULL; n <<- n - 1L; result } + pop_front <- function() { result <- vec[[1L]]; vec <<- vec[-1]; n <<- n - 1L; result } + get_list <- function() vec[seq_len(n)] + size <- function() n + list(push_back = push_back, push_front = push_front, pop_back = pop_back, pop_front = pop_front, + get_list = get_list, size = size) +} diff --git a/R/conic_solvers.R b/R/conic_solvers.R index 6ab373cb..290dfaff 100644 --- a/R/conic_solvers.R +++ b/R/conic_solvers.R @@ -917,7 +917,7 @@ setMethod("status_map", "CPLEX_CONIC", function(solver, status) { } else if(status %in% c(2, 21, 118)){ UNBOUNDED } else if(status %in% c(10, 107)){ - USER_LIMIT + INFEASIBLE_INACCURATE } else stop("CPLEX status unrecognized: ", status) }) @@ -1747,20 +1747,33 @@ setMethod("import_solver", "GUROBI_CONIC", function(solver) { requireNamespace(" #' @param status A status code returned by the solver. #' @describeIn GUROBI_CONIC Converts status returned by the GUROBI solver to its respective CVXPY status. setMethod("status_map", "GUROBI_CONIC", function(solver, status) { - if(status == 2 || status == "OPTIMAL") - OPTIMAL - else if(status == 3 || status == 6 || status == "INFEASIBLE") #DK: I added the words because the GUROBI solver seems to return the words - INFEASIBLE - else if(status == 5 || status == "UNBOUNDED") - UNBOUNDED - else if(status == 4 | status == "INF_OR_UNBD") - INFEASIBLE_INACCURATE - else if(status %in% c(7,8,9,10,11,12)) - SOLVER_ERROR # TODO: Could be anything - else if(status == 13) - OPTIMAL_INACCURATE # Means time expired. - else + status_codes <- get_solver_codes(GUROBI_NAME) + index <- match(x = status, table = status_codes$status) + if (is.na(index)) { stop("GUROBI status unrecognized: ", status) + } + result <- status_codes$cvxr_status[index] + ## On second thought, I don't like this attribute business: + ## we should be able to propagate full information in a structured way. + ## attr(result, "status_code") <- status + ## attr(result, "status_desc") <- gurobi_status_codes$desc[index] + result + ## Prev code below commented out + ## if(status == 2 || status == "OPTIMAL") + ## OPTIMAL + ## else if(status == 3 || status == 6 || status == "INFEASIBLE") #DK: I added the words because the GUROBI solver seems to return the words + ## INFEASIBLE + ## else if(status == 5 || status == "UNBOUNDED") + ## UNBOUNDED + ## else if(status == 4 | status == "INF_OR_UNBD") + ## INFEASIBLE_INACCURATE + ## else if(status %in% c(7,8,9,10,11,12)) + ## SOLVER_ERROR # TODO: Could be anything + ## else if(status == 13) + ## OPTIMAL_INACCURATE # Means time expired. + ## else + ## stop("GUROBI status unrecognized: ", status) + }) #' @param problem A \linkS4class{Problem} object. diff --git a/R/elementwise.R b/R/elementwise.R index 75abc633..7187c19e 100755 --- a/R/elementwise.R +++ b/R/elementwise.R @@ -975,7 +975,7 @@ setMethod(".domain", "Power", function(object) { }) #' @describeIn Power A list containing the output of \code{pow_low, pow_mid}, or \code{pow_high} depending on the input power. -setMethod("get_data", "Power", function(object) { list(object@p, object@w) }) +setMethod("get_data", "Power", function(object) { list(p = object@p, w = object@w, approx_error = object@approx_error, max_denom = object@max_denom) }) #' @param args A list of arguments to reconstruct the atom. If args=NULL, use the current args of the atom #' @param id_objects Currently unused. @@ -983,12 +983,14 @@ setMethod("get_data", "Power", function(object) { list(object@p, object@w) }) setMethod("copy", "Power", function(object, args = NULL, id_objects = list()) { if(is.null(args)) args <- object@args + names(args) <- "x" data <- get_data(object) - copy <- do.call(class(object), args) - copy@p <- data[[1]] - copy@w <- data[[2]] - copy@approx_error <- object@approx_error - copy + do.call(.Power, c(args, data)) + ## copy <- do.call(class(object), args) + ## copy@p <- data[[1]] + ## copy@w <- data[[2]] + ## copy@approx_error <- object@approx_error + ## copy }) #' @describeIn Power Returns the expression in string form. diff --git a/R/problem.R b/R/problem.R index a23d658d..339a3145 100755 --- a/R/problem.R +++ b/R/problem.R @@ -746,7 +746,7 @@ setMethod("solve", signature(a = "Problem", b = "ANY"), function(a, b = NA, ...) # } valuesById <- function(object, results_dict, sym_data, solver) { - if(results_dict[[STATUS]] %in% SOLUTION_PRESENT) { + if(results_dict[[STATUS]] %in% SOLUTION_PRESENT) { outList <- list(value = results_dict[[VALUE]]) ## Save values for variables in object tmp <- saveValuesById(variables(object), sym_data@.var_offsets, results_dict[[PRIMAL]]) @@ -862,7 +862,6 @@ setMethod("unpack_problem", signature(object = "Problem", solution = "Solution") # object@status <- solution@status # object@solution <- solution # return(object) - result <- list() if(solution@status %in% SOLUTION_PRESENT) { for(v in variables(object)) { @@ -948,6 +947,21 @@ setMethod("unpack_problem", signature(object = "Problem", solution = "Solution") return(result) }) +#' @importFrom cli cli_bullets +#' @method print cvxr_result +#' @export +print.cvxr_result <- function(x, ...) { + mark <- if(!is.null(x$status) && x$status == "optimal" ) "v" else "x" + out <- c( + sprintf("Status: %s", x$status), + sprintf("Objective value: %f\n", x$value), + sprintf("Solver: %s\n", x$solver), + "$getValue(x) returns value of variable/constraint x" + ) + names(out) <- c(mark, mark, "i", ">") + cli_bullets(out) +} + #' @describeIn Problem #' Parses the output from a solver and updates the problem state, including the status, #' objective value, and values of the primal and dual variables. @@ -963,7 +977,9 @@ setMethod("unpack_results", "Problem", function(object, solution, chain, inverse # return(object) results <- unpack_problem(object, solution) solver_stats <- SolverStats(solution@attr, name(chain@solver)) - return(c(results, solver_stats)) + result <- c(results, solver_stats) + class(result) <- "cvxr_result" + result }) handleNoSolution <- function(object, status) { diff --git a/R/qp_solvers.R b/R/qp_solvers.R index b28266b2..7b6ca478 100644 --- a/R/qp_solvers.R +++ b/R/qp_solvers.R @@ -140,7 +140,7 @@ setMethod("status_map", "CPLEX_QP", function(solver, status) { else if(status %in% c(2, 21, 118)) UNBOUNDED else if(status %in% c(10, 107)) - USER_LIMIT + INFEASIBLE_INACCURATE else stop("CPLEX status unrecognized: ", status) }) @@ -345,20 +345,34 @@ setMethod("mip_capable", "GUROBI_QP", function(solver) { TRUE }) #' @param status A status code returned by the solver. #' @describeIn GUROBI_QP Converts status returned by the GUROBI solver to its respective CVXPY status. setMethod("status_map", "GUROBI_QP", function(solver, status) { - if(status == 2 || status == "OPTIMAL") - OPTIMAL - else if(status == 3 || status == 6 || status == "INFEASIBLE") #DK: I added the words because the GUROBI solver seems to return the words - INFEASIBLE - else if(status == 5 || status == "UNBOUNDED") - UNBOUNDED - else if(status == 4 | status == "INF_OR_UNBD") - INFEASIBLE_INACCURATE - else if(status %in% c(7,8,9,10,11,12)) - SOLVER_ERROR # TODO: Could be anything - else if(status == 13) - OPTIMAL_INACCURATE # Means time expired. - else + gurobi_status_codes <- get_solver_codes(GUROBI_NAME) + index <- match(x = status, table = gurobi_status_codes$status) + if (is.na(index)) { stop("GUROBI status unrecognized: ", status) + } + result <- gurobi_status_codes$cvxr_status[index] + ## On second thought, I don't like this attribute business: + ## we should be able to propagate full information in a structured way. + ## attr(result, "status_code") <- status + ## attr(result, "status_desc") <- gurobi_status_codes$desc[index] + result + + ## Old approach left as is + ## if(status == 2 || status == "OPTIMAL") + ## OPTIMAL + ## else if(status == 3 || status == 6 || status == "INFEASIBLE") #DK: I added the words because the GUROBI solver seems to return the words + ## INFEASIBLE + ## else if(status == 5 || status == "UNBOUNDED") + ## UNBOUNDED + ## else if(status == 4 | status == "INF_OR_UNBD") + ## INFEASIBLE_INACCURATE + ## else if(status %in% c(7,8,9,10,11,12)) + ## SOLVER_ERROR # TODO: Could be anything + ## else if(status == 13) + ## OPTIMAL_INACCURATE # Means time expired. + ## else + ## stop("GUROBI status unrecognized: ", status) + }) #' @describeIn GUROBI_QP Returns the name of the solver. diff --git a/R/solver_utilities.R b/R/solver_utilities.R index e9ab99f7..3cc09a83 100644 --- a/R/solver_utilities.R +++ b/R/solver_utilities.R @@ -25,6 +25,8 @@ QP_SOLVERS <- c(OSQP_NAME, GUROBI_NAME, CPLEX_NAME) .CVXR_options <- new.env(parent = emptyenv()) .CVXR_options$blacklisted_solvers <- character(0) +## CVXR global cache for storing solver codes etc. +.CVXR_cache <- new.env(parent = emptyenv()) #' #' List installed solvers @@ -75,3 +77,18 @@ set_solver_blacklist <- function(solvers) { invisible(solvers) } +### +### Get solver codes from a saved file in `extdata` using solver +### canonical name and cache it if not already. For internal use +### @param name canonical name for solver, see utilities.R for names of solvers +### @return data frame of at least four columns `status` (character), +### `code` (int), `cvxr_status`, and `description` (character). +get_solver_codes <- function(name) { + result <- .CVXR_cache$status_codes[[name]] + if (is.null(result)) { + result <- .CVXR_cache$status_codes[[name]] <- + utils::read.csv(system.file("extdata", paste0(name, "_status_codes.csv"), package = "CVXR")) + } + result +} + diff --git a/R/utilities.R b/R/utilities.R index 222e77c2..96352b7f 100755 --- a/R/utilities.R +++ b/R/utilities.R @@ -29,14 +29,14 @@ INFEASIBLE = "infeasible" INFEASIBLE_INACCURATE = "infeasible_inaccurate" UNBOUNDED = "unbounded" UNBOUNDED_INACCURATE = "unbounded_inaccurate" -USER_LIMIT <- "user_limit" +USER_LIMIT <- "user_limit" ## This is now mapped to INFEASIBLE_INACCURATE per CVXPY https://github.com/cvxpy/cvxpy/pull/1270 SOLVER_ERROR = "solver_error" # Statuses that indicate a solution was found. SOLUTION_PRESENT = c(OPTIMAL, OPTIMAL_INACCURATE) # Statuses that indicate the problem is infeasible or unbounded. INF_OR_UNB = c(INFEASIBLE, INFEASIBLE_INACCURATE, UNBOUNDED, UNBOUNDED_INACCURATE) # Statuses that indicate an error. -ERROR <- c(USER_LIMIT, SOLVER_ERROR) +ERROR <- c(SOLVER_ERROR) ## Codes from lpSolveAPI solver (partial at the moment) DEGENERATE = "degenerate" @@ -47,6 +47,63 @@ BB_FAILED = "branch_and_bound_failure" ## Codes from GLPK (partial) UNDEFINED = "undefined" +## The code below seeks to create a unified solver code interface +## CVXR has a limited number of classes of solver statuses that need to be +## mapped to solver-specific codes. That mapping is supplied using a data frame +## built using solver documentation and store in extdata. +## First try will be with GUROBI since it was requested some time ago. +## Then we will slowly convert all others, one by one. +cvxr_status <- list( + optimal = "optimal", + optimal_inaccurate = "optimal_inaccurate", + infeasible = "infeasible", + infeasible_inaccurate = "infeasible_inaccurate", + unbounded = "unbounded", + unbounded_inaccurate = "unbounded_inaccurate", + infeasible_or_unbounded = "infeasible_or_unbounded", + user_limit = "user_limit", + solver_error = "solver_error") + +## Is a solution present, based on a cvxr status? +solution_present <- function(status) { + status %in% c(cvxr_status$optimal, + cvxr_status$optimal_inaccurate, + cvxr_status$user_limit) +} + +## Is a solution infeasible or unbounded based on a cvxr status? +solution_inf_or_ub <- function(status) { + status %in% c(cvxr_status$infeasible, + cvxr_status$infeasible_inaccurate, + cvxr_status$unbounded, + cvxr_status$unbounded_inaccurate, + cvxr_status$infeasible_or_unbounded) +} + +## Is a solution inaccurate based on a cvxr status? +solution_inaccurate <- function(status) { + status %in% c(cvxr_status$optimal_inaccurate, + cvxr_status$infeasible_inaccurate, + cvxr_status$unbounded_inaccurate, + cvxr_status$user_limit) +} + +## Is a solution an error based on a cvxr status? +solution_error <- function(status) { + status %in% c(cvxr_status$solver_error) +} + +## Codes from lpSolveAPI solver (partial at the moment) +DEGENERATE = "degenerate" +NUMERICAL_FAILURE = "numerical_failure" +TIMEOUT = "timeout" +BB_FAILED = "branch_and_bound_failure" + +## Codes from GLPK (partial) +UNDEFINED = "undefined" + + + # Solver names. CBC_NAME = "CBC" CPLEX_NAME = "CPLEX" diff --git a/R/variable.R b/R/variable.R index 52b826a5..bc9dac8c 100755 --- a/R/variable.R +++ b/R/variable.R @@ -121,41 +121,41 @@ NonNegative <- function(rows = 1, cols = 1, name = NA_character_) { Variable(row Symmetric <- function(n, name = NA_character_) { Variable(rows = n, cols = n, name = name, symmetric = TRUE) } Semidef <- function(n, name = NA_character_) { Variable(rows = n, cols = n, name = name, PSD = TRUE) } -# -# Upper Triangle to Full Matrix -# -# Returns a coefficient matrix to create a symmetric matrix. -# -# @param n The width/height of the matrix -# @return The coefficient matrix. -upper_tri_to_full <- function(n) { - if(n == 0) - return(sparseMatrix(i = c(), j = c(), dims = c(0, 0))) +## # NOW done in C for performance: SEE src/RcppConv.cpp +## # Upper Triangle to Full Matrix +## # +## # Returns a coefficient matrix to create a symmetric matrix. +## # +## # @param n The width/height of the matrix +## # @return The coefficient matrix. +## upper_tri_to_full <- function(n) { +## if(n == 0) +## return(sparseMatrix(i = c(), j = c(), dims = c(0, 0))) - entries <- floor(n*(n+1)/2) +## entries <- floor(n*(n+1)/2) - val_arr <- c() - row_arr <- c() - col_arr <- c() - count <- 1 - for(i in 1:n) { - for(j in i:n) { - # Index in the original matrix - col_arr <- c(col_arr, count) +## val_arr <- c() +## row_arr <- c() +## col_arr <- c() +## count <- 1 +## for(i in 1:n) { +## for(j in i:n) { +## # Index in the original matrix +## col_arr <- c(col_arr, count) - # Index in the filled matrix - row_arr <- c(row_arr, (j-1)*n + i) - val_arr <- c(val_arr, 1.0) - if(i != j) { - # Index in the original matrix - col_arr <- c(col_arr, count) +## # Index in the filled matrix +## row_arr <- c(row_arr, (j-1)*n + i) +## val_arr <- c(val_arr, 1.0) +## if(i != j) { +## # Index in the original matrix +## col_arr <- c(col_arr, count) - # Index in the filled matrix - row_arr <- c(row_arr, (i-1)*n + j) - val_arr <- c(val_arr, 1.0) - } - count <- count + 1 - } - } - sparseMatrix(i = row_arr, j = col_arr, x = val_arr, dims = c(n^2, entries)) -} +## # Index in the filled matrix +## row_arr <- c(row_arr, (i-1)*n + j) +## val_arr <- c(val_arr, 1.0) +## } +## count <- count + 1 +## } +## } +## sparseMatrix(i = row_arr, j = col_arr, x = val_arr, dims = c(n^2, entries)) +## } diff --git a/docs/404.html b/docs/404.html index 0977b1e1..f5885b11 100644 --- a/docs/404.html +++ b/docs/404.html @@ -18,13 +18,14 @@ + - +
@@ -50,7 +51,7 @@
- +
@@ -109,16 +110,16 @@

Page not found (404)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/LICENSE-text.html b/docs/LICENSE-text.html index a8c5d46f..9056a1f5 100644 --- a/docs/LICENSE-text.html +++ b/docs/LICENSE-text.html @@ -1,9 +1,9 @@ -License • CVXRLicense • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -278,15 +278,15 @@

License

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/articles/cvxr_intro.html b/docs/articles/cvxr_intro.html index 3f334afc..a88825a4 100644 --- a/docs/articles/cvxr_intro.html +++ b/docs/articles/cvxr_intro.html @@ -18,14 +18,13 @@ - - +
@@ -51,7 +50,7 @@
- +
@@ -91,7 +90,7 @@

Disciplined Convex Optimization in R

Anqi Fu, Balasubramanian Narasimhan and Stephen Boyd

-

2024-06-26

+

2024-11-05

Source: vignettes/cvxr_intro.Rmd @@ -132,9 +131,21 @@

A Simple Example

We generate some synthetic data where we know the model completely, that is

-

\[ Y = X\beta + \epsilon \]

-

where \(Y\) is a \(100\times 1\) vector, \(X\) is a \(100\times 10\) matrix, \(\beta = [-4,\ldots ,-1, 0, 1, \ldots, 5]\) -is a \(10\times 1\) vector, and \(\epsilon \sim N(0, 1)\).

+

Y=Xβ+ϵ Y = X\beta + \epsilon

+

where +YY +is a +100×1100\times 1 +vector, +XX +is a +100×10100\times 10 +matrix, +β=[4,,1,0,1,,5]\beta = [-4,\ldots ,-1, 0, 1, \ldots, 5] +is a +10×110\times 1 +vector, and +ϵN(0,1)\epsilon \sim N(0, 1).

 set.seed(123)
 
@@ -145,8 +156,14 @@ 

A Simple ExampleX <- matrix(rnorm(n * p), nrow=n) colnames(X) <- paste0("beta_", beta) Y <- X %*% beta + rnorm(n)

-

Given the data \(X\) and \(Y\), we can estimate the \(\beta\) vector using lm -function in R that fits a standard regression model.

+

Given the data +XX +and +YY, +we can estimate the +β\beta +vector using lm function in R that fits a standard +regression model.

The CVXR formulation

The CVXR formulation states the above as an optimization problem:

-

\[ +

minimizeβyXβ22, \begin{array}{ll} \underset{\beta}{\mbox{minimize}} & \|y - X\beta\|_2^2, \end{array} -\] which directly translates into a problem that -CVXR can solve as shown in the steps below.

+ which directly translates into a +problem that CVXR can solve as shown in the steps +below.

  • Step 0. Load the CVXR library
@@ -262,52 +282,52 @@

The CVXR formulation -\(\beta_{1}\) +β1\beta_{1} -3.9196886 -3.9196886 -\(\beta_{2}\) +β2\beta_{2} -3.0117048 -3.0117048 -\(\beta_{3}\) +β3\beta_{3} -2.1248242 -2.1248242 -\(\beta_{4}\) +β4\beta_{4} -0.8666048 -0.8666048 -\(\beta_{5}\) +β5\beta_{5} 0.0914658 0.0914658 -\(\beta_{6}\) +β6\beta_{6} 0.9490454 0.9490454 -\(\beta_{7}\) +β7\beta_{7} 2.0764700 2.0764700 -\(\beta_{8}\) +β8\beta_{8} 3.1272275 3.1272275 -\(\beta_{9}\) +β9\beta_{9} 3.9609565 3.9609565 -\(\beta_{10}\) +β10\beta_{10} 5.1348845 5.1348845 @@ -321,8 +341,9 @@

Wait a minute! What have we gained?lm with at least five or six lines of new R code. On top of that, the code actually runs slower, and so it is not clear what was really achieved.

-

So suppose we knew for a fact that the \(\beta\)s were nonnegative and we wish to -take this fact into account. This is nonnegative +

So suppose we knew for a fact that the +β\betas +were nonnegative and we wish to take this fact into account. This is nonnegative least squares regression and lm would no longer do the job.

In CVXR, the modified problem merely requires the @@ -340,43 +361,43 @@

Wait a minute! What have we gained? -\(\beta_{1}\) +β1\beta_{1} 0.0000000 -\(\beta_{2}\) +β2\beta_{2} 0.0000000 -\(\beta_{3}\) +β3\beta_{3} 0.0000000 -\(\beta_{4}\) +β4\beta_{4} 0.0000000 -\(\beta_{5}\) +β5\beta_{5} 1.2374488 -\(\beta_{6}\) +β6\beta_{6} 0.6234665 -\(\beta_{7}\) +β7\beta_{7} 2.1230663 -\(\beta_{8}\) +β8\beta_{8} 2.8035640 -\(\beta_{9}\) +β9\beta_{9} 4.4448016 -\(\beta_{10}\) +β10\beta_{10} 5.2073521 @@ -402,52 +423,52 @@

Wait a minute! What have we gained? -\(\beta_{1}\) +β1\beta_{1} 0.0000000 0.0000000 -\(\beta_{2}\) +β2\beta_{2} 0.0000000 0.0000000 -\(\beta_{3}\) +β3\beta_{3} 0.0000000 0.0000000 -\(\beta_{4}\) +β4\beta_{4} 0.0000000 0.0000000 -\(\beta_{5}\) +β5\beta_{5} 1.2374488 1.2374488 -\(\beta_{6}\) +β6\beta_{6} 0.6234665 0.6234665 -\(\beta_{7}\) +β7\beta_{7} 2.1230663 2.1230663 -\(\beta_{8}\) +β8\beta_{8} 2.8035640 2.8035640 -\(\beta_{9}\) +β9\beta_{9} 4.4448016 4.4448016 -\(\beta_{10}\) +β10\beta_{10} 5.2073521 5.2073521 @@ -460,14 +481,24 @@

Okay that was cool, but…As you no doubt noticed, we have done nothing that other R packages could not do.

So now suppose that we know, for some extraneous reason, that the sum -of \(\beta_2\) and \(\beta_3\) is nonpositive and but all other -\(\beta\)s are nonnegative.

+of +β2\beta_2 +and +β3\beta_3 +is nonpositive and but all other +β\betas +are nonnegative.

It is clear that this problem would not fit into any standard package. But in CVXR, this is easily done by adding a few constraints.

-

To express the fact that \(\beta_2 + -\beta_3\) is nonpositive, we construct a row matrix with zeros -everywhere, except in positions 2 and 3 (for \(\beta_2\) and \(\beta_3\) respectively).

+

To express the fact that +β2+β3\beta_2 + \beta_3 +is nonpositive, we construct a row matrix with zeros everywhere, except +in positions 2 and 3 (for +β2\beta_2 +and +β3\beta_3 +respectively).

but it is easier working with matrices in general with CVXR.

-

For the nonnegativity for rest of the variables, we construct a \(10\times -10\) matrix \(A\) to have 1’s -along the diagonal everywhere except rows 2 and 3 and zeros +

For the nonnegativity for rest of the variables, we construct a +10×1010\times +10 matrix +AA +to have 1’s along the diagonal everywhere except rows 2 and 3 and zeros everywhere.

 B <- diag(c(1, 0, 0, rep(1, 7)))
@@ -546,20 +580,20 @@ 

Okay that was cool, but… -\(\beta_{1}\) -\(\beta_{2}\) -\(\beta_{3}\) -\(\beta_{4}\) -\(\beta_{5}\) -\(\beta_{6}\) -\(\beta_{7}\) -\(\beta_{8}\) -\(\beta_{9}\) -\(\beta_{10}\) +β1\beta_{1} +β2\beta_{2} +β3\beta_{3} +β4\beta_{4} +β5\beta_{5} +β6\beta_{6} +β7\beta_{7} +β8\beta_{8} +β9\beta_{9} +β10\beta_{10} -\(\beta_{1}\) +β1\beta_{1} 1 0 0 @@ -572,7 +606,7 @@

Okay that was cool, but…0 -\(\beta_{2}\) +β2\beta_{2} 0 0 0 @@ -585,7 +619,7 @@

Okay that was cool, but…0 -\(\beta_{3}\) +β3\beta_{3} 0 0 0 @@ -598,7 +632,7 @@

Okay that was cool, but…0 -\(\beta_{4}\) +β4\beta_{4} 0 0 0 @@ -611,7 +645,7 @@

Okay that was cool, but…0 -\(\beta_{5}\) +β5\beta_{5} 0 0 0 @@ -624,7 +658,7 @@

Okay that was cool, but…0 -\(\beta_{6}\) +β6\beta_{6} 0 0 0 @@ -637,7 +671,7 @@

Okay that was cool, but…0 -\(\beta_{7}\) +β7\beta_{7} 0 0 0 @@ -650,7 +684,7 @@

Okay that was cool, but…0 -\(\beta_{8}\) +β8\beta_{8} 0 0 0 @@ -663,7 +697,7 @@

Okay that was cool, but…0 -\(\beta_{9}\) +β9\beta_{9} 0 0 0 @@ -676,7 +710,7 @@

Okay that was cool, but…0 -\(\beta_{10}\) +β10\beta_{10} 0 0 0 @@ -690,9 +724,10 @@

Okay that was cool, but… -

The constraint for positivity is \[ +

The constraint for positivity is +Bβ>0 B\beta > 0 -\]

+

which we express in R as

@@ -700,7 +735,8 @@

Okay that was cool, but…
 problem <- Problem(objective, constraints = list(constraint1, constraint2))
 result <- solve(problem)

-

And we can get the estimates of \(\beta\).

+

And we can get the estimates of +β\beta.

+

@@ -796,16 +830,16 @@

References

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/articles/cvxr_intro_files/header-attrs-2.11/header-attrs.js b/docs/articles/cvxr_intro_files/header-attrs-2.11/header-attrs.js deleted file mode 100644 index dd57d92e..00000000 --- a/docs/articles/cvxr_intro_files/header-attrs-2.11/header-attrs.js +++ /dev/null @@ -1,12 +0,0 @@ -// Pandoc 2.9 adds attributes on both header and div. We remove the former (to -// be compatible with the behavior of Pandoc < 2.8). -document.addEventListener('DOMContentLoaded', function(e) { - var hs = document.querySelectorAll("div.section[class*='level'] > :first-child"); - var i, h, a; - for (i = 0; i < hs.length; i++) { - h = hs[i]; - if (!/^h[1-6]$/i.test(h.tagName)) continue; // it should be a header h1-h6 - a = h.attributes; - while (a.length > 0) h.removeAttribute(a[0].name); - } -}); diff --git a/docs/articles/cvxr_intro_files/header-attrs-2.3/header-attrs.js b/docs/articles/cvxr_intro_files/header-attrs-2.3/header-attrs.js deleted file mode 100644 index dd57d92e..00000000 --- a/docs/articles/cvxr_intro_files/header-attrs-2.3/header-attrs.js +++ /dev/null @@ -1,12 +0,0 @@ -// Pandoc 2.9 adds attributes on both header and div. We remove the former (to -// be compatible with the behavior of Pandoc < 2.8). -document.addEventListener('DOMContentLoaded', function(e) { - var hs = document.querySelectorAll("div.section[class*='level'] > :first-child"); - var i, h, a; - for (i = 0; i < hs.length; i++) { - h = hs[i]; - if (!/^h[1-6]$/i.test(h.tagName)) continue; // it should be a header h1-h6 - a = h.attributes; - while (a.length > 0) h.removeAttribute(a[0].name); - } -}); diff --git a/docs/articles/index.html b/docs/articles/index.html index 62638ba5..5c5c812c 100644 --- a/docs/articles/index.html +++ b/docs/articles/index.html @@ -1,9 +1,9 @@ -Articles • CVXRArticles • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -77,15 +77,15 @@

All vignettes

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/articles/version1.html b/docs/articles/version1.html index 9c7a1df8..c6183d5e 100644 --- a/docs/articles/version1.html +++ b/docs/articles/version1.html @@ -18,14 +18,13 @@ - - +
@@ -51,7 +50,7 @@
- +
@@ -91,7 +90,7 @@

Version 1.0

Anqi Fu, David W. Kang, Balasubramanian Narasimhan and Stephen Boyd

-

2024-06-26

+

2024-11-05

Source: vignettes/version1.Rmd @@ -145,9 +144,7 @@

What has changed? - -

+
@@ -160,16 +157,16 @@

What has changed?

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/articles/version1_files/header-attrs-2.11/header-attrs.js b/docs/articles/version1_files/header-attrs-2.11/header-attrs.js deleted file mode 100644 index dd57d92e..00000000 --- a/docs/articles/version1_files/header-attrs-2.11/header-attrs.js +++ /dev/null @@ -1,12 +0,0 @@ -// Pandoc 2.9 adds attributes on both header and div. We remove the former (to -// be compatible with the behavior of Pandoc < 2.8). -document.addEventListener('DOMContentLoaded', function(e) { - var hs = document.querySelectorAll("div.section[class*='level'] > :first-child"); - var i, h, a; - for (i = 0; i < hs.length; i++) { - h = hs[i]; - if (!/^h[1-6]$/i.test(h.tagName)) continue; // it should be a header h1-h6 - a = h.attributes; - while (a.length > 0) h.removeAttribute(a[0].name); - } -}); diff --git a/docs/articles/version1_files/header-attrs-2.3/header-attrs.js b/docs/articles/version1_files/header-attrs-2.3/header-attrs.js deleted file mode 100644 index dd57d92e..00000000 --- a/docs/articles/version1_files/header-attrs-2.3/header-attrs.js +++ /dev/null @@ -1,12 +0,0 @@ -// Pandoc 2.9 adds attributes on both header and div. We remove the former (to -// be compatible with the behavior of Pandoc < 2.8). -document.addEventListener('DOMContentLoaded', function(e) { - var hs = document.querySelectorAll("div.section[class*='level'] > :first-child"); - var i, h, a; - for (i = 0; i < hs.length; i++) { - h = hs[i]; - if (!/^h[1-6]$/i.test(h.tagName)) continue; // it should be a header h1-h6 - a = h.attributes; - while (a.length > 0) h.removeAttribute(a[0].name); - } -}); diff --git a/docs/authors.html b/docs/authors.html index 5a671375..937b817d 100644 --- a/docs/authors.html +++ b/docs/authors.html @@ -1,9 +1,9 @@ -Authors and Citation • CVXRAuthors and Citation • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -60,33 +60,33 @@

Authors and Citation

- +
@@ -101,7 +101,7 @@

Citation

Fu A, Narasimhan B, Boyd S (2020). “CVXR: An R Package for Disciplined Convex Optimization.” Journal of Statistical Software, 94(14), 1–34. -doi:10.18637/jss.v094.i14. +doi:10.18637/jss.v094.i14.

@Article{,
   title = {{CVXR}: An {R} Package for Disciplined Convex Optimization},
@@ -125,15 +125,15 @@ 

Citation

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/index.html b/docs/index.html index a87149ee..abf58aa0 100644 --- a/docs/index.html +++ b/docs/index.html @@ -19,13 +19,14 @@ + - +
@@ -51,7 +52,7 @@
- +
@@ -168,16 +169,16 @@

Developers

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/news/index.html b/docs/news/index.html index af39ddfd..ad7855ff 100644 --- a/docs/news/index.html +++ b/docs/news/index.html @@ -1,9 +1,9 @@ -Changelog • CVXRChangelog • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -61,7 +61,17 @@

Changelog

- + +
  • Revert clarabel requirement and use enhance rather than import until really necessary (Issue 142).
  • +
  • Update return codes for user_limit etc to be infeasible_inaccurate to match CVXPY for gurobi +
  • +
  • Add an S3 print method for result from solve().
  • +
  • Move upper_tri_to_full to C++
  • +
  • Drop use of R6 classes
  • +
  • Address bug in copying Power object (Issue 145).
  • +
+
+
  • Address further inefficiency in use of diagonal matrices in qp2quad_form.R
  • Add initial interface to clarabel solver
  • @@ -176,15 +186,15 @@
- - + + diff --git a/docs/pkgdown.yml b/docs/pkgdown.yml index 181f6178..976c99bd 100644 --- a/docs/pkgdown.yml +++ b/docs/pkgdown.yml @@ -1,11 +1,10 @@ -pandoc: '3.2' -pkgdown: 2.0.9 +pandoc: '3.5' +pkgdown: 2.1.1 pkgdown_sha: ~ articles: cvxr_intro: cvxr_intro.html version1: version1.html -last_built: 2024-06-26T20:08Z +last_built: 2024-11-05T17:34Z urls: reference: https://www.cvxgrp.org/CVXR/reference article: https://www.cvxgrp.org/CVXR/articles - diff --git a/docs/reference/$,DgpCanonMethods-method.html b/docs/reference/$,DgpCanonMethods-method.html new file mode 100644 index 00000000..1922f56e --- /dev/null +++ b/docs/reference/$,DgpCanonMethods-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/$,Rdict-method.html b/docs/reference/$,Rdict-method.html new file mode 100644 index 00000000..aa0a0d7c --- /dev/null +++ b/docs/reference/$,Rdict-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/%x%.html b/docs/reference/%x%.html new file mode 100644 index 00000000..4478187d --- /dev/null +++ b/docs/reference/%x%.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,ConstVal,Expression-method.html b/docs/reference/+,ConstVal,Expression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/+,ConstVal,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,Expression,ConstVal-method.html b/docs/reference/+,Expression,ConstVal-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/+,Expression,ConstVal-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,Expression,Expression-method.html b/docs/reference/+,Expression,Expression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/+,Expression,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,Maximize,Maximize-method.html b/docs/reference/+,Maximize,Maximize-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/+,Maximize,Maximize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,Maximize,Minimize-method.html b/docs/reference/+,Maximize,Minimize-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/+,Maximize,Minimize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,Minimize,Maximize-method.html b/docs/reference/+,Minimize,Maximize-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/+,Minimize,Maximize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,Minimize,Minimize-method.html b/docs/reference/+,Minimize,Minimize-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/+,Minimize,Minimize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,Objective,numeric-method.html b/docs/reference/+,Objective,numeric-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/+,Objective,numeric-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,Problem,Problem-method.html b/docs/reference/+,Problem,Problem-method.html new file mode 100644 index 00000000..a7f9254d --- /dev/null +++ b/docs/reference/+,Problem,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,Problem,missing-method.html b/docs/reference/+,Problem,missing-method.html new file mode 100644 index 00000000..a7f9254d --- /dev/null +++ b/docs/reference/+,Problem,missing-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,Problem,numeric-method.html b/docs/reference/+,Problem,numeric-method.html new file mode 100644 index 00000000..a7f9254d --- /dev/null +++ b/docs/reference/+,Problem,numeric-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,numeric,Objective-method.html b/docs/reference/+,numeric,Objective-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/+,numeric,Objective-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/+,numeric,Problem-method.html b/docs/reference/+,numeric,Problem-method.html new file mode 100644 index 00000000..a7f9254d --- /dev/null +++ b/docs/reference/+,numeric,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,ConstVal,Expression-method.html b/docs/reference/-,ConstVal,Expression-method.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/-,ConstVal,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Expression,ConstVal-method.html b/docs/reference/-,Expression,ConstVal-method.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/-,Expression,ConstVal-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Expression,Expression-method.html b/docs/reference/-,Expression,Expression-method.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/-,Expression,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Maximize,Objective-method.html b/docs/reference/-,Maximize,Objective-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/-,Maximize,Objective-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Maximize,missing-method.html b/docs/reference/-,Maximize,missing-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/-,Maximize,missing-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Minimize,Objective-method.html b/docs/reference/-,Minimize,Objective-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/-,Minimize,Objective-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Minimize,missing-method.html b/docs/reference/-,Minimize,missing-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/-,Minimize,missing-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Objective,Maximize-method.html b/docs/reference/-,Objective,Maximize-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/-,Objective,Maximize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Objective,Minimize-method.html b/docs/reference/-,Objective,Minimize-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/-,Objective,Minimize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Objective,numeric-method.html b/docs/reference/-,Objective,numeric-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/-,Objective,numeric-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Problem,Problem-method.html b/docs/reference/-,Problem,Problem-method.html new file mode 100644 index 00000000..a7f9254d --- /dev/null +++ b/docs/reference/-,Problem,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Problem,missing-method.html b/docs/reference/-,Problem,missing-method.html new file mode 100644 index 00000000..a7f9254d --- /dev/null +++ b/docs/reference/-,Problem,missing-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,Problem,numeric-method.html b/docs/reference/-,Problem,numeric-method.html new file mode 100644 index 00000000..a7f9254d --- /dev/null +++ b/docs/reference/-,Problem,numeric-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,numeric,Objective-method.html b/docs/reference/-,numeric,Objective-method.html new file mode 100644 index 00000000..e75d4b53 --- /dev/null +++ b/docs/reference/-,numeric,Objective-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/-,numeric,Problem-method.html b/docs/reference/-,numeric,Problem-method.html new file mode 100644 index 00000000..a7f9254d --- /dev/null +++ b/docs/reference/-,numeric,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Abs.html b/docs/reference/.Abs.html new file mode 100644 index 00000000..6bc6fe74 --- /dev/null +++ b/docs/reference/.Abs.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.AddExpression.html b/docs/reference/.AddExpression.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/.AddExpression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.CallbackParam.html b/docs/reference/.CallbackParam.html new file mode 100644 index 00000000..36e5ac84 --- /dev/null +++ b/docs/reference/.CallbackParam.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Canonicalization.html b/docs/reference/.Canonicalization.html new file mode 100644 index 00000000..2887cd44 --- /dev/null +++ b/docs/reference/.Canonicalization.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Chain.html b/docs/reference/.Chain.html new file mode 100644 index 00000000..b79652f0 --- /dev/null +++ b/docs/reference/.Chain.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.ConeDims.html b/docs/reference/.ConeDims.html new file mode 100644 index 00000000..e091d84a --- /dev/null +++ b/docs/reference/.ConeDims.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Conjugate.html b/docs/reference/.Conjugate.html new file mode 100644 index 00000000..2be5e9ec --- /dev/null +++ b/docs/reference/.Conjugate.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Constant.html b/docs/reference/.Constant.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/.Constant.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Conv.html b/docs/reference/.Conv.html new file mode 100644 index 00000000..dcfbf487 --- /dev/null +++ b/docs/reference/.Conv.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.CumMax.html b/docs/reference/.CumMax.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/.CumMax.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.CumSum.html b/docs/reference/.CumSum.html new file mode 100644 index 00000000..9d5b0806 --- /dev/null +++ b/docs/reference/.CumSum.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Dcp2Cone.html b/docs/reference/.Dcp2Cone.html new file mode 100644 index 00000000..36a6775f --- /dev/null +++ b/docs/reference/.Dcp2Cone.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.DgpCanonMethods.html b/docs/reference/.DgpCanonMethods.html new file mode 100644 index 00000000..1922f56e --- /dev/null +++ b/docs/reference/.DgpCanonMethods.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.DiagMat.html b/docs/reference/.DiagMat.html new file mode 100644 index 00000000..c7ee6a1c --- /dev/null +++ b/docs/reference/.DiagMat.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.DiagVec.html b/docs/reference/.DiagVec.html new file mode 100644 index 00000000..13c5eb42 --- /dev/null +++ b/docs/reference/.DiagVec.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.DivExpression.html b/docs/reference/.DivExpression.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/.DivExpression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.EliminatePwl.html b/docs/reference/.EliminatePwl.html new file mode 100644 index 00000000..b27849cc --- /dev/null +++ b/docs/reference/.EliminatePwl.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Entr.html b/docs/reference/.Entr.html new file mode 100644 index 00000000..2d645861 --- /dev/null +++ b/docs/reference/.Entr.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.EqConstraint.html b/docs/reference/.EqConstraint.html new file mode 100644 index 00000000..9ee425a1 --- /dev/null +++ b/docs/reference/.EqConstraint.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Exp.html b/docs/reference/.Exp.html new file mode 100644 index 00000000..ddba19b6 --- /dev/null +++ b/docs/reference/.Exp.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.ExpCone.html b/docs/reference/.ExpCone.html new file mode 100644 index 00000000..ec35993c --- /dev/null +++ b/docs/reference/.ExpCone.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.EyeMinusInv.html b/docs/reference/.EyeMinusInv.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/.EyeMinusInv.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.GeoMean.html b/docs/reference/.GeoMean.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/.GeoMean.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.HStack.html b/docs/reference/.HStack.html new file mode 100644 index 00000000..306a2fec --- /dev/null +++ b/docs/reference/.HStack.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Huber.html b/docs/reference/.Huber.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/.Huber.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Imag.html b/docs/reference/.Imag.html new file mode 100644 index 00000000..162e57af --- /dev/null +++ b/docs/reference/.Imag.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Index.html b/docs/reference/.Index.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/.Index.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.IneqConstraint.html b/docs/reference/.IneqConstraint.html new file mode 100644 index 00000000..d750b8f5 --- /dev/null +++ b/docs/reference/.IneqConstraint.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.InverseData.html b/docs/reference/.InverseData.html new file mode 100644 index 00000000..870c0a30 --- /dev/null +++ b/docs/reference/.InverseData.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.KLDiv.html b/docs/reference/.KLDiv.html new file mode 100644 index 00000000..fa937a81 --- /dev/null +++ b/docs/reference/.KLDiv.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Kron.html b/docs/reference/.Kron.html new file mode 100644 index 00000000..1b6e7ff6 --- /dev/null +++ b/docs/reference/.Kron.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.LambdaMax.html b/docs/reference/.LambdaMax.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/.LambdaMax.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.LambdaSumLargest.html b/docs/reference/.LambdaSumLargest.html new file mode 100644 index 00000000..44111716 --- /dev/null +++ b/docs/reference/.LambdaSumLargest.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Log.html b/docs/reference/.Log.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/.Log.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Log1p.html b/docs/reference/.Log1p.html new file mode 100644 index 00000000..5ff748f6 --- /dev/null +++ b/docs/reference/.Log1p.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.LogDet.html b/docs/reference/.LogDet.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/.LogDet.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.LogSumExp.html b/docs/reference/.LogSumExp.html new file mode 100644 index 00000000..994650e9 --- /dev/null +++ b/docs/reference/.LogSumExp.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Logistic.html b/docs/reference/.Logistic.html new file mode 100644 index 00000000..cf33b8ec --- /dev/null +++ b/docs/reference/.Logistic.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.MatrixFrac.html b/docs/reference/.MatrixFrac.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/.MatrixFrac.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.MaxElemwise.html b/docs/reference/.MaxElemwise.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/.MaxElemwise.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.MaxEntries.html b/docs/reference/.MaxEntries.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/.MaxEntries.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Maximize.html b/docs/reference/.Maximize.html new file mode 100644 index 00000000..24ee6b70 --- /dev/null +++ b/docs/reference/.Maximize.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.MinElemwise.html b/docs/reference/.MinElemwise.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/.MinElemwise.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.MinEntries.html b/docs/reference/.MinEntries.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/.MinEntries.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Minimize.html b/docs/reference/.Minimize.html new file mode 100644 index 00000000..14d22bec --- /dev/null +++ b/docs/reference/.Minimize.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.MulExpression.html b/docs/reference/.MulExpression.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/.MulExpression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Multiply.html b/docs/reference/.Multiply.html new file mode 100644 index 00000000..99f85b11 --- /dev/null +++ b/docs/reference/.Multiply.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.NegExpression.html b/docs/reference/.NegExpression.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/.NegExpression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.NonPosConstraint.html b/docs/reference/.NonPosConstraint.html new file mode 100644 index 00000000..687578bd --- /dev/null +++ b/docs/reference/.NonPosConstraint.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.NonlinearConstraint.html b/docs/reference/.NonlinearConstraint.html new file mode 100644 index 00000000..1b5719f4 --- /dev/null +++ b/docs/reference/.NonlinearConstraint.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Norm1.html b/docs/reference/.Norm1.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/.Norm1.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.NormInf.html b/docs/reference/.NormInf.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/.NormInf.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.NormNuc.html b/docs/reference/.NormNuc.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/.NormNuc.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Objective.html b/docs/reference/.Objective.html new file mode 100644 index 00000000..6c63d296 --- /dev/null +++ b/docs/reference/.Objective.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.OneMinusPos.html b/docs/reference/.OneMinusPos.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/.OneMinusPos.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.PSDConstraint.html b/docs/reference/.PSDConstraint.html new file mode 100644 index 00000000..0f746d96 --- /dev/null +++ b/docs/reference/.PSDConstraint.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.PSDWrap.html b/docs/reference/.PSDWrap.html new file mode 100644 index 00000000..88230429 --- /dev/null +++ b/docs/reference/.PSDWrap.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Parameter.html b/docs/reference/.Parameter.html new file mode 100644 index 00000000..2f7668bf --- /dev/null +++ b/docs/reference/.Parameter.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.PfEigenvalue.html b/docs/reference/.PfEigenvalue.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/.PfEigenvalue.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Pnorm.html b/docs/reference/.Pnorm.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/.Pnorm.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Power.html b/docs/reference/.Power.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/.Power.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Problem.html b/docs/reference/.Problem.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/.Problem.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.ProdEntries.html b/docs/reference/.ProdEntries.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/.ProdEntries.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Promote.html b/docs/reference/.Promote.html new file mode 100644 index 00000000..3454ffa2 --- /dev/null +++ b/docs/reference/.Promote.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Qp2SymbolicQp.html b/docs/reference/.Qp2SymbolicQp.html new file mode 100644 index 00000000..b31dc95a --- /dev/null +++ b/docs/reference/.Qp2SymbolicQp.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.QuadForm.html b/docs/reference/.QuadForm.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/.QuadForm.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.QuadOverLin.html b/docs/reference/.QuadOverLin.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/.QuadOverLin.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Real.html b/docs/reference/.Real.html new file mode 100644 index 00000000..80f9cd35 --- /dev/null +++ b/docs/reference/.Real.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Reshape.html b/docs/reference/.Reshape.html new file mode 100644 index 00000000..cbc7c98b --- /dev/null +++ b/docs/reference/.Reshape.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.SOC.html b/docs/reference/.SOC.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/.SOC.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.SOCAxis.html b/docs/reference/.SOCAxis.html new file mode 100644 index 00000000..07ea6c39 --- /dev/null +++ b/docs/reference/.SOCAxis.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.SigmaMax.html b/docs/reference/.SigmaMax.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/.SigmaMax.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.SizeMetrics.html b/docs/reference/.SizeMetrics.html new file mode 100644 index 00000000..3eab363c --- /dev/null +++ b/docs/reference/.SizeMetrics.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Solution.html b/docs/reference/.Solution.html new file mode 100644 index 00000000..3a141a31 --- /dev/null +++ b/docs/reference/.Solution.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.SolverStats.html b/docs/reference/.SolverStats.html new file mode 100644 index 00000000..49c271ce --- /dev/null +++ b/docs/reference/.SolverStats.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.SolvingChain.html b/docs/reference/.SolvingChain.html new file mode 100644 index 00000000..05c7896c --- /dev/null +++ b/docs/reference/.SolvingChain.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.SpecialIndex.html b/docs/reference/.SpecialIndex.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/.SpecialIndex.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.SumEntries.html b/docs/reference/.SumEntries.html new file mode 100644 index 00000000..4b2e8863 --- /dev/null +++ b/docs/reference/.SumEntries.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.SumLargest.html b/docs/reference/.SumLargest.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/.SumLargest.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.SymbolicQuadForm.html b/docs/reference/.SymbolicQuadForm.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/.SymbolicQuadForm.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Trace.html b/docs/reference/.Trace.html new file mode 100644 index 00000000..4a1e58a1 --- /dev/null +++ b/docs/reference/.Trace.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Transpose.html b/docs/reference/.Transpose.html new file mode 100644 index 00000000..6d90f546 --- /dev/null +++ b/docs/reference/.Transpose.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.UpperTri.html b/docs/reference/.UpperTri.html new file mode 100644 index 00000000..0d5027f1 --- /dev/null +++ b/docs/reference/.UpperTri.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.VStack.html b/docs/reference/.VStack.html new file mode 100644 index 00000000..736da1a4 --- /dev/null +++ b/docs/reference/.VStack.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.Variable.html b/docs/reference/.Variable.html new file mode 100644 index 00000000..32eadf30 --- /dev/null +++ b/docs/reference/.Variable.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.ZeroConstraint.html b/docs/reference/.ZeroConstraint.html new file mode 100644 index 00000000..10615fe5 --- /dev/null +++ b/docs/reference/.ZeroConstraint.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.axis_grad,AxisAtom-method.html b/docs/reference/.axis_grad,AxisAtom-method.html new file mode 100644 index 00000000..276fa9c6 --- /dev/null +++ b/docs/reference/.axis_grad,AxisAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.column_grad,AxisAtom-method.html b/docs/reference/.column_grad,AxisAtom-method.html new file mode 100644 index 00000000..276fa9c6 --- /dev/null +++ b/docs/reference/.column_grad,AxisAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.column_grad,CumMax-method.html b/docs/reference/.column_grad,CumMax-method.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/.column_grad,CumMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.column_grad,LogSumExp-method.html b/docs/reference/.column_grad,LogSumExp-method.html new file mode 100644 index 00000000..994650e9 --- /dev/null +++ b/docs/reference/.column_grad,LogSumExp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.column_grad,MaxEntries-method.html b/docs/reference/.column_grad,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/.column_grad,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.column_grad,MinEntries-method.html b/docs/reference/.column_grad,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/.column_grad,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.column_grad,Norm1-method.html b/docs/reference/.column_grad,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/.column_grad,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.column_grad,NormInf-method.html b/docs/reference/.column_grad,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/.column_grad,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.column_grad,Pnorm-method.html b/docs/reference/.column_grad,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/.column_grad,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.column_grad,ProdEntries-method.html b/docs/reference/.column_grad,ProdEntries-method.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/.column_grad,ProdEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,Entr-method.html b/docs/reference/.domain,Entr-method.html new file mode 100644 index 00000000..2d645861 --- /dev/null +++ b/docs/reference/.domain,Entr-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,GeoMean-method.html b/docs/reference/.domain,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/.domain,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,KLDiv-method.html b/docs/reference/.domain,KLDiv-method.html new file mode 100644 index 00000000..fa937a81 --- /dev/null +++ b/docs/reference/.domain,KLDiv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,LambdaMax-method.html b/docs/reference/.domain,LambdaMax-method.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/.domain,LambdaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,Log-method.html b/docs/reference/.domain,Log-method.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/.domain,Log-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,Log1p-method.html b/docs/reference/.domain,Log1p-method.html new file mode 100644 index 00000000..5ff748f6 --- /dev/null +++ b/docs/reference/.domain,Log1p-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,LogDet-method.html b/docs/reference/.domain,LogDet-method.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/.domain,LogDet-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,MatrixFrac-method.html b/docs/reference/.domain,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/.domain,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,Norm1-method.html b/docs/reference/.domain,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/.domain,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,NormInf-method.html b/docs/reference/.domain,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/.domain,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,Pnorm-method.html b/docs/reference/.domain,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/.domain,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,Power-method.html b/docs/reference/.domain,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/.domain,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.domain,QuadOverLin-method.html b/docs/reference/.domain,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/.domain,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,AffAtom-method.html b/docs/reference/.grad,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/.grad,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,CumMax-method.html b/docs/reference/.grad,CumMax-method.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/.grad,CumMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,CumSum-method.html b/docs/reference/.grad,CumSum-method.html new file mode 100644 index 00000000..9d5b0806 --- /dev/null +++ b/docs/reference/.grad,CumSum-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,Entr-method.html b/docs/reference/.grad,Entr-method.html new file mode 100644 index 00000000..2d645861 --- /dev/null +++ b/docs/reference/.grad,Entr-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,Exp-method.html b/docs/reference/.grad,Exp-method.html new file mode 100644 index 00000000..ddba19b6 --- /dev/null +++ b/docs/reference/.grad,Exp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,EyeMinusInv-method.html b/docs/reference/.grad,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/.grad,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,GeoMean-method.html b/docs/reference/.grad,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/.grad,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,Huber-method.html b/docs/reference/.grad,Huber-method.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/.grad,Huber-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,KLDiv-method.html b/docs/reference/.grad,KLDiv-method.html new file mode 100644 index 00000000..fa937a81 --- /dev/null +++ b/docs/reference/.grad,KLDiv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,LambdaMax-method.html b/docs/reference/.grad,LambdaMax-method.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/.grad,LambdaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,LambdaSumLargest-method.html b/docs/reference/.grad,LambdaSumLargest-method.html new file mode 100644 index 00000000..44111716 --- /dev/null +++ b/docs/reference/.grad,LambdaSumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,Log-method.html b/docs/reference/.grad,Log-method.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/.grad,Log-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,Log1p-method.html b/docs/reference/.grad,Log1p-method.html new file mode 100644 index 00000000..5ff748f6 --- /dev/null +++ b/docs/reference/.grad,Log1p-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,LogDet-method.html b/docs/reference/.grad,LogDet-method.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/.grad,LogDet-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,LogSumExp-method.html b/docs/reference/.grad,LogSumExp-method.html new file mode 100644 index 00000000..994650e9 --- /dev/null +++ b/docs/reference/.grad,LogSumExp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,Logistic-method.html b/docs/reference/.grad,Logistic-method.html new file mode 100644 index 00000000..cf33b8ec --- /dev/null +++ b/docs/reference/.grad,Logistic-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,MatrixFrac-method.html b/docs/reference/.grad,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/.grad,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,MaxElemwise-method.html b/docs/reference/.grad,MaxElemwise-method.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/.grad,MaxElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,MaxEntries-method.html b/docs/reference/.grad,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/.grad,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,MinElemwise-method.html b/docs/reference/.grad,MinElemwise-method.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/.grad,MinElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,MinEntries-method.html b/docs/reference/.grad,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/.grad,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,MulExpression-method.html b/docs/reference/.grad,MulExpression-method.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/.grad,MulExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,Norm1-method.html b/docs/reference/.grad,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/.grad,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,NormInf-method.html b/docs/reference/.grad,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/.grad,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,NormNuc-method.html b/docs/reference/.grad,NormNuc-method.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/.grad,NormNuc-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,OneMinusPos-method.html b/docs/reference/.grad,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/.grad,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,PfEigenvalue-method.html b/docs/reference/.grad,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/.grad,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,Pnorm-method.html b/docs/reference/.grad,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/.grad,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,Power-method.html b/docs/reference/.grad,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/.grad,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,ProdEntries-method.html b/docs/reference/.grad,ProdEntries-method.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/.grad,ProdEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,QuadForm-method.html b/docs/reference/.grad,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/.grad,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,QuadOverLin-method.html b/docs/reference/.grad,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/.grad,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,SigmaMax-method.html b/docs/reference/.grad,SigmaMax-method.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/.grad,SigmaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,SpecialIndex-method.html b/docs/reference/.grad,SpecialIndex-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/.grad,SpecialIndex-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,SumLargest-method.html b/docs/reference/.grad,SumLargest-method.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/.grad,SumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/.grad,SymbolicQuadForm-method.html b/docs/reference/.grad,SymbolicQuadForm-method.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/.grad,SymbolicQuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/==,ConstVal,Expression-method.html b/docs/reference/==,ConstVal,Expression-method.html new file mode 100644 index 00000000..9ee425a1 --- /dev/null +++ b/docs/reference/==,ConstVal,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/==,Expression,ConstVal-method.html b/docs/reference/==,Expression,ConstVal-method.html new file mode 100644 index 00000000..9ee425a1 --- /dev/null +++ b/docs/reference/==,Expression,ConstVal-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Abs-class.html b/docs/reference/Abs-class.html index b5155d76..b1874a8e 100644 --- a/docs/reference/Abs-class.html +++ b/docs/reference/Abs-class.html @@ -1,9 +1,9 @@ -The Abs class. — Abs-class • CVXRThe Abs class. — Abs-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,52 +68,54 @@

The Abs class.

Abs(x)
 
-# S4 method for Abs
+# S4 method for class 'Abs'
 to_numeric(object, values)
 
-# S4 method for Abs
+# S4 method for class 'Abs'
 allow_complex(object)
 
-# S4 method for Abs
+# S4 method for class 'Abs'
 sign_from_args(object)
 
-# S4 method for Abs
+# S4 method for class 'Abs'
 is_atom_convex(object)
 
-# S4 method for Abs
+# S4 method for class 'Abs'
 is_atom_concave(object)
 
-# S4 method for Abs
+# S4 method for class 'Abs'
 is_incr(object, idx)
 
-# S4 method for Abs
+# S4 method for class 'Abs'
 is_decr(object, idx)
 
-# S4 method for Abs
+# S4 method for class 'Abs'
 is_pwl(object)

Arguments

-
x
+ + +
x

An Expression object.

-
object
+
object

An Abs object.

-
values
+
values

A list of arguments to the atom.

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(Abs): The elementwise absolute value of the input.

  • allow_complex(Abs): Does the atom handle complex numbers?

  • sign_from_args(Abs): The atom is positive.

  • @@ -125,7 +127,7 @@

    Methods (by generic)

Slots

- +
x

An Expression object.

@@ -145,15 +147,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/AddExpression-class.html b/docs/reference/AddExpression-class.html index 780d18f3..bbaa7ff4 100644 --- a/docs/reference/AddExpression-class.html +++ b/docs/reference/AddExpression-class.html @@ -1,9 +1,9 @@ -The AddExpression class. — +,Expression,missing-method • CVXRThe AddExpression class. — +,Expression,missing-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,83 +66,85 @@

The AddExpression class.

-
# S4 method for Expression,missing
-+(e1, e2)
-
-# S4 method for Expression,Expression
-+(e1, e2)
-
-# S4 method for Expression,ConstVal
-+(e1, e2)
-
-# S4 method for ConstVal,Expression
-+(e1, e2)
-
-# S4 method for AddExpression
-dim_from_args(object)
-
-# S4 method for AddExpression
-name(x)
-
-# S4 method for AddExpression
-to_numeric(object, values)
-
-# S4 method for AddExpression
-is_atom_log_log_convex(object)
-
-# S4 method for AddExpression
-is_atom_log_log_concave(object)
-
-# S4 method for AddExpression
-is_symmetric(object)
-
-# S4 method for AddExpression
-is_hermitian(object)
-
-# S4 method for AddExpression
-copy(object, args = NULL, id_objects = list())
-
-# S4 method for AddExpression
-graph_implementation(object, arg_objs, dim, data = NA_real_)
+
# S4 method for class 'Expression,missing'
+e1 + e2
+
+# S4 method for class 'Expression,Expression'
+e1 + e2
+
+# S4 method for class 'Expression,ConstVal'
+e1 + e2
+
+# S4 method for class 'ConstVal,Expression'
+e1 + e2
+
+# S4 method for class 'AddExpression'
+dim_from_args(object)
+
+# S4 method for class 'AddExpression'
+name(x)
+
+# S4 method for class 'AddExpression'
+to_numeric(object, values)
+
+# S4 method for class 'AddExpression'
+is_atom_log_log_convex(object)
+
+# S4 method for class 'AddExpression'
+is_atom_log_log_concave(object)
+
+# S4 method for class 'AddExpression'
+is_symmetric(object)
+
+# S4 method for class 'AddExpression'
+is_hermitian(object)
+
+# S4 method for class 'AddExpression'
+copy(object, args = NULL, id_objects = list())
+
+# S4 method for class 'AddExpression'
+graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
e1, e2
+ + +
e1, e2

The Expression objects or numeric constants to add.

-
x, object
+
x, object

An AddExpression object.

-
values
+
values

A list of arguments to the atom.

-
args
+
args

An optional list of arguments to reconstruct the atom. Default is to use current args of the atom.

-
id_objects
+
id_objects

Currently unused.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • dim_from_args(AddExpression): The dimensions of the expression.

  • name(AddExpression): The string form of the expression.

  • to_numeric(AddExpression): Sum all the values.

  • @@ -155,7 +157,7 @@

    Methods (by generic)

Slots

- +
arg_groups

A list of Expressions and numeric data.frame, matrix, or vector objects.

@@ -175,15 +177,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/AddExpression.html b/docs/reference/AddExpression.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/AddExpression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/AffAtom-class.html b/docs/reference/AffAtom-class.html index a0b117bd..a88e653b 100644 --- a/docs/reference/AffAtom-class.html +++ b/docs/reference/AffAtom-class.html @@ -1,9 +1,9 @@ -The AffAtom class. — AffAtom-class • CVXRThe AffAtom class. — AffAtom-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,66 +66,68 @@

The AffAtom class.

-
# S4 method for AffAtom
+    
# S4 method for class 'AffAtom'
 allow_complex(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 sign_from_args(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_imag(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_complex(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_atom_convex(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_atom_concave(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_incr(object, idx)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_decr(object, idx)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_quadratic(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_qpwa(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_pwl(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_psd(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 is_nsd(object)
 
-# S4 method for AffAtom
+# S4 method for class 'AffAtom'
 .grad(object, values)

Arguments

-
object
+ + +
object

An AffAtom object.

-
idx
+
idx

An index into the atom.

-
values
+
values

A list of numeric values for the arguments

Methods (by generic)

- +
  • allow_complex(AffAtom): Does the atom handle complex numbers?

  • sign_from_args(AffAtom): The sign of the atom.

  • is_imag(AffAtom): Is the atom imaginary?

  • @@ -154,15 +156,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/AffAtom.html b/docs/reference/AffAtom.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/AffAtom.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Atom-class.html b/docs/reference/Atom-class.html index d26b0609..f5cc0c0b 100644 --- a/docs/reference/Atom-class.html +++ b/docs/reference/Atom-class.html @@ -1,9 +1,9 @@ -The Atom class. — Atom-class • CVXRThe Atom class. — Atom-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,91 +66,93 @@

The Atom class.

-
# S4 method for Atom
+    
# S4 method for class 'Atom'
 name(x)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 validate_args(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 dim(x)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 nrow(x)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 ncol(x)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 allow_complex(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 is_nonneg(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 is_nonpos(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 is_imag(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 is_complex(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 is_convex(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 is_concave(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 is_log_log_convex(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 is_log_log_concave(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 canonicalize(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 graph_implementation(object, arg_objs, dim, data = NA_real_)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 value_impl(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 value(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 grad(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 domain(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 atoms(object)

Arguments

-
x, object
+ + +
x, object

An Atom object.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector with two elements representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • name(Atom): Returns the string representtation of the function call

  • validate_args(Atom): Raises an error if the arguments are invalid.

  • dim(Atom): The c(row, col) dimensions of the atom.

  • @@ -186,15 +188,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Atom.html b/docs/reference/Atom.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/Atom.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/AxisAtom-class.html b/docs/reference/AxisAtom-class.html index 003c76aa..67ce3120 100644 --- a/docs/reference/AxisAtom-class.html +++ b/docs/reference/AxisAtom-class.html @@ -1,9 +1,9 @@ -The AxisAtom class. — AxisAtom-class • CVXRThe AxisAtom class. — AxisAtom-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,39 +66,41 @@

The AxisAtom class.

-
# S4 method for AxisAtom
+    
# S4 method for class 'AxisAtom'
 dim_from_args(object)
 
-# S4 method for AxisAtom
+# S4 method for class 'AxisAtom'
 get_data(object)
 
-# S4 method for AxisAtom
+# S4 method for class 'AxisAtom'
 validate_args(object)
 
-# S4 method for AxisAtom
+# S4 method for class 'AxisAtom'
 .axis_grad(object, values)
 
-# S4 method for AxisAtom
+# S4 method for class 'AxisAtom'
 .column_grad(object, value)

Arguments

-
object
+ + +
object

An Atom object.

-
values
+
values

A list of numeric values for the arguments

-
value
+
value

A numeric value

Methods (by generic)

- +
  • dim_from_args(AxisAtom): The dimensions of the atom determined from its arguments.

  • get_data(AxisAtom): A list containing axis and keepdims.

  • validate_args(AxisAtom): Check that the new dimensions have the same number of entries as the old.

  • @@ -107,7 +109,7 @@

    Methods (by generic)

Slots

- +
expr

A numeric element, data.frame, matrix, vector, or Expression.

@@ -135,15 +137,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/AxisAtom.html b/docs/reference/AxisAtom.html new file mode 100644 index 00000000..276fa9c6 --- /dev/null +++ b/docs/reference/AxisAtom.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/BinaryOperator-class.html b/docs/reference/BinaryOperator-class.html index 2bd9da49..604f1f3f 100644 --- a/docs/reference/BinaryOperator-class.html +++ b/docs/reference/BinaryOperator-class.html @@ -1,9 +1,9 @@ -The BinaryOperator class. — BinaryOperator-class • CVXRThe BinaryOperator class. — BinaryOperator-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,35 +66,37 @@

The BinaryOperator class.

-
# S4 method for BinaryOperator
+    
# S4 method for class 'BinaryOperator'
 name(x)
 
-# S4 method for BinaryOperator
+# S4 method for class 'BinaryOperator'
 to_numeric(object, values)
 
-# S4 method for BinaryOperator
+# S4 method for class 'BinaryOperator'
 sign_from_args(object)
 
-# S4 method for BinaryOperator
+# S4 method for class 'BinaryOperator'
 is_imag(object)
 
-# S4 method for BinaryOperator
+# S4 method for class 'BinaryOperator'
 is_complex(object)

Arguments

-
x, object
+ + +
x, object

A BinaryOperator object.

-
values
+
values

A list of arguments to the atom.

Methods (by generic)

- +
  • name(BinaryOperator): Returns the name of the BinaryOperator object.

  • to_numeric(BinaryOperator): Apply the binary operator to the values.

  • sign_from_args(BinaryOperator): Default to rule for multiplication.

  • @@ -103,7 +105,7 @@

    Methods (by generic)

Slots

- +
lh_exp

The Expression on the left-hand side of the operator.

@@ -131,15 +133,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/BinaryOperator.html b/docs/reference/BinaryOperator.html new file mode 100644 index 00000000..0ce00269 --- /dev/null +++ b/docs/reference/BinaryOperator.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/CBC_CONIC-class.html b/docs/reference/CBC_CONIC-class.html index 5cdfb245..f74299b0 100644 --- a/docs/reference/CBC_CONIC-class.html +++ b/docs/reference/CBC_CONIC-class.html @@ -1,9 +1,9 @@ -An interface to the CBC solver — CBC_CONIC-class • CVXRAn interface to the CBC solver — CBC_CONIC-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,34 +68,34 @@

An interface to the CBC solver

CBC_CONIC()
 
-# S4 method for CBC_CONIC
+# S4 method for class 'CBC_CONIC'
 mip_capable(solver)
 
-# S4 method for CBC_CONIC
+# S4 method for class 'CBC_CONIC'
 status_map(solver, status)
 
-# S4 method for CBC_CONIC
+# S4 method for class 'CBC_CONIC'
 status_map_mip(solver, status)
 
-# S4 method for CBC_CONIC
+# S4 method for class 'CBC_CONIC'
 status_map_lp(solver, status)
 
-# S4 method for CBC_CONIC
+# S4 method for class 'CBC_CONIC'
 name(x)
 
-# S4 method for CBC_CONIC
+# S4 method for class 'CBC_CONIC'
 import_solver(solver)
 
-# S4 method for CBC_CONIC,Problem
+# S4 method for class 'CBC_CONIC,Problem'
 accepts(object, problem)
 
-# S4 method for CBC_CONIC,Problem
+# S4 method for class 'CBC_CONIC,Problem'
 perform(object, problem)
 
-# S4 method for CBC_CONIC,list,list
+# S4 method for class 'CBC_CONIC,list,list'
 invert(object, solution, inverse_data)
 
-# S4 method for CBC_CONIC
+# S4 method for class 'CBC_CONIC'
 solve_via_data(
   object,
   data,
@@ -112,65 +112,67 @@ 

An interface to the CBC solver

Arguments

-
solver, object, x
+ + +
solver, object, x

A CBC_CONIC object.

-
status
+
status

A status code returned by the solver.

-
problem
+
problem

A Problem object.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A list containing data necessary for the inversion.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance.

-
reltol
+
reltol

The relative tolerance.

-
abstol
+
abstol

The absolute tolerance.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(CBC_CONIC): Can the solver handle mixed-integer programs?

  • status_map(CBC_CONIC): Converts status returned by the CBC solver to its respective CVXPY status.

  • status_map_mip(CBC_CONIC): Converts status returned by the CBC solver to its respective CVXPY status for mixed integer problems.

  • @@ -195,15 +197,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CBC_CONIC.html b/docs/reference/CBC_CONIC.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/CBC_CONIC.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/CLARABEL-class.html b/docs/reference/CLARABEL-class.html index b62315a4..3410c98e 100644 --- a/docs/reference/CLARABEL-class.html +++ b/docs/reference/CLARABEL-class.html @@ -1,9 +1,9 @@ -An interface for the CLARABEL solver — CLARABEL-class • CVXRAn interface for the CLARABEL solver — CLARABEL-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,28 +68,28 @@

An interface for the CLARABEL solver

CLARABEL()
 
-# S4 method for CLARABEL
+# S4 method for class 'CLARABEL'
 mip_capable(solver)
 
-# S4 method for CLARABEL
+# S4 method for class 'CLARABEL'
 status_map(solver, status)
 
-# S4 method for CLARABEL
+# S4 method for class 'CLARABEL'
 name(x)
 
-# S4 method for CLARABEL
+# S4 method for class 'CLARABEL'
 import_solver(solver)
 
-# S4 method for CLARABEL
+# S4 method for class 'CLARABEL'
 reduction_format_constr(object, problem, constr, exp_cone_order)
 
-# S4 method for CLARABEL,Problem
+# S4 method for class 'CLARABEL,Problem'
 perform(object, problem)
 
-# S4 method for CLARABEL,list,list
+# S4 method for class 'CLARABEL,list,list'
 invert(object, solution, inverse_data)
 
-# S4 method for CLARABEL
+# S4 method for class 'CLARABEL'
 solve_via_data(
   object,
   data,
@@ -106,73 +106,75 @@ 

An interface for the CLARABEL solver

Arguments

-
solver, object, x
+ + +
solver, object, x

A CLARABEL object.

-
status
+
status

A status code returned by the solver.

-
problem
+
problem

A Problem object.

-
constr
+
constr

A Constraint to format.

-
exp_cone_order
+
exp_cone_order

A list indicating how the exponential cone arguments are ordered.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A list containing data necessary for the inversion.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance on the primal and dual residual.

-
reltol
+
reltol

The relative tolerance on the duality gap.

-
abstol
+
abstol

The absolute tolerance on the duality gap.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(CLARABEL): Can the solver handle mixed-integer programs?

  • status_map(CLARABEL): Converts status returned by CLARABEL solver to its respective CVXPY status.

  • name(CLARABEL): Returns the name of the solver

  • @@ -195,15 +197,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CLARABEL.dims_to_solver_dict.html b/docs/reference/CLARABEL.dims_to_solver_dict.html index ff76250b..89f3f7f8 100644 --- a/docs/reference/CLARABEL.dims_to_solver_dict.html +++ b/docs/reference/CLARABEL.dims_to_solver_dict.html @@ -1,10 +1,10 @@ Utility method for formatting a ConeDims instance into a dictionary that can be supplied to Clarabel — CLARABEL.dims_to_solver_dict • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -73,15 +73,15 @@

Utility method for formatting a ConeDims instance into a dictionary that can

Arguments

-
cone_dims
+ + +
cone_dims

A ConeDims instance.

Value

- - -

The dimensions of the cones.

+

The dimensions of the cones.

@@ -96,15 +96,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CLARABEL.extract_dual_value.html b/docs/reference/CLARABEL.extract_dual_value.html index 3a0dd0ea..d73a5d89 100644 --- a/docs/reference/CLARABEL.extract_dual_value.html +++ b/docs/reference/CLARABEL.extract_dual_value.html @@ -1,9 +1,9 @@ -Extracts the dual value for constraint starting at offset. — CLARABEL.extract_dual_value • CVXRExtracts the dual value for constraint starting at offset. — CLARABEL.extract_dual_value • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Extracts the dual value for constraint starting at offset.

Arguments

-
result_vec
+ + +
result_vec

The vector to extract dual values from.

-
offset
+
offset

The starting point of the vector to extract from.

-
constraint
+
constraint

A Constraint object.

Value

- - -

The dual values for the corresponding PSD constraints

+

The dual values for the corresponding PSD constraints

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CLARABEL.html b/docs/reference/CLARABEL.html new file mode 100644 index 00000000..7b9f7df2 --- /dev/null +++ b/docs/reference/CLARABEL.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/CPLEX_CONIC-class.html b/docs/reference/CPLEX_CONIC-class.html index dfda0515..dd5622fd 100644 --- a/docs/reference/CPLEX_CONIC-class.html +++ b/docs/reference/CPLEX_CONIC-class.html @@ -1,9 +1,9 @@ -An interface for the CPLEX solver — CPLEX_CONIC-class • CVXRAn interface for the CPLEX solver — CPLEX_CONIC-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -70,28 +70,28 @@

An interface for the CPLEX solver

CPLEX_CONIC() -# S4 method for CPLEX_CONIC +# S4 method for class 'CPLEX_CONIC' mip_capable(solver) -# S4 method for CPLEX_CONIC +# S4 method for class 'CPLEX_CONIC' name(x) -# S4 method for CPLEX_CONIC +# S4 method for class 'CPLEX_CONIC' import_solver(solver) -# S4 method for CPLEX_CONIC,Problem +# S4 method for class 'CPLEX_CONIC,Problem' accepts(object, problem) -# S4 method for CPLEX_CONIC +# S4 method for class 'CPLEX_CONIC' status_map(solver, status) -# S4 method for CPLEX_CONIC,Problem +# S4 method for class 'CPLEX_CONIC,Problem' perform(object, problem) -# S4 method for CPLEX_CONIC,list,list +# S4 method for class 'CPLEX_CONIC,list,list' invert(object, solution, inverse_data) -# S4 method for CPLEX_CONIC +# S4 method for class 'CPLEX_CONIC' solve_via_data( object, data, @@ -108,65 +108,67 @@

An interface for the CPLEX solver

Arguments

-
solver, object, x
+ + +
solver, object, x

A CPLEX_CONIC object.

-
problem
+
problem

A Problem object.

-
status
+
status

A status code returned by the solver.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A list containing data necessary for the inversion.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance on the primal and dual residual.

-
reltol
+
reltol

The relative tolerance on the duality gap.

-
abstol
+
abstol

The absolute tolerance on the duality gap.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(CPLEX_CONIC): Can the solver handle mixed-integer programs?

  • name(CPLEX_CONIC): Returns the name of the solver.

  • import_solver(CPLEX_CONIC): Imports the solver.

  • @@ -189,15 +191,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CPLEX_CONIC.html b/docs/reference/CPLEX_CONIC.html new file mode 100644 index 00000000..4665af60 --- /dev/null +++ b/docs/reference/CPLEX_CONIC.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/CPLEX_QP-class.html b/docs/reference/CPLEX_QP-class.html index c1e77557..f717bebe 100644 --- a/docs/reference/CPLEX_QP-class.html +++ b/docs/reference/CPLEX_QP-class.html @@ -1,9 +1,9 @@ -An interface for the CPLEX solver. — CPLEX_QP-class • CVXRAn interface for the CPLEX solver. — CPLEX_QP-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,22 +68,22 @@

An interface for the CPLEX solver.

CPLEX_QP()
 
-# S4 method for CPLEX_QP
+# S4 method for class 'CPLEX_QP'
 mip_capable(solver)
 
-# S4 method for CPLEX_QP
+# S4 method for class 'CPLEX_QP'
 status_map(solver, status)
 
-# S4 method for CPLEX_QP
+# S4 method for class 'CPLEX_QP'
 name(x)
 
-# S4 method for CPLEX_QP
+# S4 method for class 'CPLEX_QP'
 import_solver(solver)
 
-# S4 method for CPLEX_QP,list,InverseData
+# S4 method for class 'CPLEX_QP,list,InverseData'
 invert(object, solution, inverse_data)
 
-# S4 method for CPLEX_QP
+# S4 method for class 'CPLEX_QP'
 solve_via_data(
   object,
   data,
@@ -100,61 +100,63 @@ 

An interface for the CPLEX solver.

Arguments

-
status
+ + +
status

A status code returned by the solver.

-
x, object, solver
+
x, object, solver

A CPLEX_QP object.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A InverseData object containing data necessary for the inversion.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance on the primal and dual residual.

-
reltol
+
reltol

The relative tolerance on the duality gap.

-
abstol
+
abstol

The absolute tolerance on the duality gap.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(CPLEX_QP): Can the solver handle mixed-integer programs?

  • status_map(CPLEX_QP): Converts status returned by the CPLEX solver to its respective CVXPY status.

  • name(CPLEX_QP): Returns the name of the solver.

  • @@ -175,15 +177,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CPLEX_QP.html b/docs/reference/CPLEX_QP.html new file mode 100644 index 00000000..a63ea235 --- /dev/null +++ b/docs/reference/CPLEX_QP.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/CVXOPT-class.html b/docs/reference/CVXOPT-class.html index 48e62c94..a9820240 100644 --- a/docs/reference/CVXOPT-class.html +++ b/docs/reference/CVXOPT-class.html @@ -1,9 +1,9 @@ -An interface for the CVXOPT solver. — CVXOPT-class • CVXRAn interface for the CVXOPT solver. — CVXOPT-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,28 +66,28 @@

An interface for the CVXOPT solver.

-
# S4 method for CVXOPT
+    
# S4 method for class 'CVXOPT'
 mip_capable(solver)
 
-# S4 method for CVXOPT
+# S4 method for class 'CVXOPT'
 status_map(solver, status)
 
-# S4 method for CVXOPT
+# S4 method for class 'CVXOPT'
 name(x)
 
-# S4 method for CVXOPT
+# S4 method for class 'CVXOPT'
 import_solver(solver)
 
-# S4 method for CVXOPT,Problem
+# S4 method for class 'CVXOPT,Problem'
 accepts(object, problem)
 
-# S4 method for CVXOPT,Problem
+# S4 method for class 'CVXOPT,Problem'
 perform(object, problem)
 
-# S4 method for CVXOPT,list,list
+# S4 method for class 'CVXOPT,list,list'
 invert(object, solution, inverse_data)
 
-# S4 method for CVXOPT
+# S4 method for class 'CVXOPT'
 solve_via_data(
   object,
   data,
@@ -104,65 +104,67 @@ 

An interface for the CVXOPT solver.

Arguments

-
solver, object, x
+ + +
solver, object, x

A CVXOPT object.

-
status
+
status

A status code returned by the solver.

-
problem
+
problem

A Problem object.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A list containing data necessary for the inversion.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance on the primal and dual residual.

-
reltol
+
reltol

The relative tolerance on the duality gap.

-
abstol
+
abstol

The absolute tolerance on the duality gap.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(CVXOPT): Can the solver handle mixed-integer programs?

  • status_map(CVXOPT): Converts status returned by the CVXOPT solver to its respective CVXPY status.

  • name(CVXOPT): Returns the name of the solver.

  • @@ -185,15 +187,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CVXR-package.html b/docs/reference/CVXR-package.html index 491f4478..7463e434 100644 --- a/docs/reference/CVXR-package.html +++ b/docs/reference/CVXR-package.html @@ -10,11 +10,11 @@ signed disciplined convex programming (DCP) to verify the problem's convexity. Once verified, the problem is converted into standard conic form using graph implementations and passed to a cone solver -such as ECOS or SCS."> - +
@@ -39,7 +39,7 @@
- +
@@ -113,15 +113,15 @@

Author

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CVXR.html b/docs/reference/CVXR.html new file mode 100644 index 00000000..b25da641 --- /dev/null +++ b/docs/reference/CVXR.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/CallbackParam-class.html b/docs/reference/CallbackParam-class.html index 9ba8d516..e8d8984c 100644 --- a/docs/reference/CallbackParam-class.html +++ b/docs/reference/CallbackParam-class.html @@ -1,9 +1,9 @@ -The CallbackParam class. — CallbackParam-class • CVXRThe CallbackParam class. — CallbackParam-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,31 +68,33 @@

The CallbackParam class.

CallbackParam(callback, dim = NULL, ...)
 
-# S4 method for CallbackParam
+# S4 method for class 'CallbackParam'
 value(object)

Arguments

-
callback
+ + +
callback

A callback function that generates the parameter value.

-
dim
+
dim

The dimensions of the parameter.

-
...
+
...

Additional attribute arguments. See Leaf for details.

-
object
+
object

A CallbackParam object.

Slots

- +
callback

A callback function that generates the parameter value.

@@ -124,14 +126,17 @@

Examples

#> [1] 2 1 #> #> $attributes$callback -#> function() { value(x) } -#> <environment: 0x7f7acd8edd28> +#> function () +#> { +#> value(x) +#> } +#> <environment: 0x7fcd5ecdaa58> #> #> $attributes$name #> [1] "paramNA" #> #> $attributes$venv -#> <environment: 0x7f7a8c9cc3d0> +#> <environment: 0x7fcd5f155958> #> #> $attributes$.is_vector #> [1] FALSE @@ -260,15 +265,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CallbackParam.html b/docs/reference/CallbackParam.html new file mode 100644 index 00000000..36e5ac84 --- /dev/null +++ b/docs/reference/CallbackParam.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Canonical-class.html b/docs/reference/Canonical-class.html index 5a045036..030ad137 100644 --- a/docs/reference/Canonical-class.html +++ b/docs/reference/Canonical-class.html @@ -1,9 +1,9 @@ -The Canonical class. — Canonical-class • CVXRThe Canonical class. — Canonical-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,40 +66,42 @@

The Canonical class.

-
# S4 method for Canonical
+    
# S4 method for class 'Canonical'
 expr(object)
 
-# S4 method for Canonical
+# S4 method for class 'Canonical'
 id(object)
 
-# S4 method for Canonical
+# S4 method for class 'Canonical'
 canonical_form(object)
 
-# S4 method for Canonical
+# S4 method for class 'Canonical'
 variables(object)
 
-# S4 method for Canonical
+# S4 method for class 'Canonical'
 parameters(object)
 
-# S4 method for Canonical
+# S4 method for class 'Canonical'
 constants(object)
 
-# S4 method for Canonical
+# S4 method for class 'Canonical'
 atoms(object)
 
-# S4 method for Canonical
+# S4 method for class 'Canonical'
 get_data(object)

Arguments

-
object
+ + +
object

A Canonical object.

Methods (by generic)

- +
  • expr(Canonical): The expression associated with the input.

  • id(Canonical): The unique ID of the canonical expression.

  • canonical_form(Canonical): The graph implementation of the input.

  • @@ -122,15 +124,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Canonicalization-class.html b/docs/reference/Canonicalization-class.html index f789901e..763d28ae 100644 --- a/docs/reference/Canonicalization-class.html +++ b/docs/reference/Canonicalization-class.html @@ -1,9 +1,9 @@ -The Canonicalization class. — Canonicalization-class • CVXRThe Canonicalization class. — Canonicalization-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,48 +66,50 @@

The Canonicalization class.

-
# S4 method for Canonicalization,Problem
+    
# S4 method for class 'Canonicalization,Problem'
 perform(object, problem)
 
-# S4 method for Canonicalization,Solution,InverseData
+# S4 method for class 'Canonicalization,Solution,InverseData'
 invert(object, solution, inverse_data)
 
-# S4 method for Canonicalization
+# S4 method for class 'Canonicalization'
 canonicalize_tree(object, expr)
 
-# S4 method for Canonicalization
+# S4 method for class 'Canonicalization'
 canonicalize_expr(object, expr, args)

Arguments

-
object
+ + +
object

A Canonicalization object.

-
problem
+
problem

A Problem object.

-
solution
+
solution

A Solution to a problem that generated the inverse data.

-
inverse_data
+
inverse_data

An InverseData object that contains the data encoding the original problem.

-
expr
+
expr

An Expression object.

-
args
+
args

List of arguments to canonicalize the expression.

Methods (by generic)

- +
  • perform(object = Canonicalization, problem = Problem): Recursively canonicalize the objective and every constraint.

  • invert( object = Canonicalization, @@ -130,15 +132,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Chain-class.html b/docs/reference/Chain-class.html index 696bbc8c..f3553b28 100644 --- a/docs/reference/Chain-class.html +++ b/docs/reference/Chain-class.html @@ -1,10 +1,10 @@ The Chain class. — Chain-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -68,40 +68,42 @@

The Chain class.

-
# S4 method for Chain
+    
# S4 method for class 'Chain'
 as.character(x)
 
-# S4 method for Chain,Problem
+# S4 method for class 'Chain,Problem'
 accepts(object, problem)
 
-# S4 method for Chain,Problem
+# S4 method for class 'Chain,Problem'
 perform(object, problem)
 
-# S4 method for Chain,SolutionORList,list
+# S4 method for class 'Chain,SolutionORList,list'
 invert(object, solution, inverse_data)

Arguments

-
x, object
+ + +
x, object

A Chain object.

-
problem
+
problem

A Problem object to check.

-
solution
+
solution

A Solution or list.

-
inverse_data
+
inverse_data

A list that contains the data encoding the original problem.

Methods (by generic)

- +
  • accepts(object = Chain, problem = Problem): A problem is accepted if the sequence of reductions is valid. In particular, the i-th reduction must accept the output of the i-1th reduction, with the first reduction (self.reductions[0]) in the sequence taking as input the supplied problem.

  • perform(object = Chain, problem = Problem): Applies the chain to a problem and returns an equivalent problem.

  • @@ -120,15 +122,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real-class.html b/docs/reference/Complex2Real-class.html index 7ac3da2a..464f79c7 100644 --- a/docs/reference/Complex2Real-class.html +++ b/docs/reference/Complex2Real-class.html @@ -1,10 +1,10 @@ Lifts complex numbers to a real representation. — Complex2Real-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -68,37 +68,39 @@

Lifts complex numbers to a real representation.

-
# S4 method for Complex2Real,Problem
+    
# S4 method for class 'Complex2Real,Problem'
 accepts(object, problem)
 
-# S4 method for Complex2Real,Problem
+# S4 method for class 'Complex2Real,Problem'
 perform(object, problem)
 
-# S4 method for Complex2Real,Solution,InverseData
+# S4 method for class 'Complex2Real,Solution,InverseData'
 invert(object, solution, inverse_data)

Arguments

-
object
+ + +
object

A Complex2Real object.

-
problem
+
problem

A Problem object.

-
solution
+
solution

A Solution object to invert.

-
inverse_data
+
inverse_data

A InverseData object containing data necessary for the inversion.

Methods (by generic)

- +
  • accepts(object = Complex2Real, problem = Problem): Checks whether or not the problem involves any complex numbers.

  • perform(object = Complex2Real, problem = Problem): Converts a Complex problem into a Real one.

  • invert(object = Complex2Real, solution = Solution, inverse_data = InverseData): Returns a solution to the original problem given the inverse data.

  • @@ -116,15 +118,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.abs_canon.html b/docs/reference/Complex2Real.abs_canon.html index 8a848e8b..5d9e5c69 100644 --- a/docs/reference/Complex2Real.abs_canon.html +++ b/docs/reference/Complex2Real.abs_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the absolute value atom — Complex2Real.abs_canon • CVXRComplex canonicalizer for the absolute value atom — Complex2Real.abs_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the absolute value atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of the absolute value atom of a complex expression, where the returned +

A canonicalization of the absolute value atom of a complex expression, where the returned variables are its real and imaginary components parsed out.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.add.html b/docs/reference/Complex2Real.add.html index dcc39bea..7a495aa1 100644 --- a/docs/reference/Complex2Real.add.html +++ b/docs/reference/Complex2Real.add.html @@ -1,9 +1,9 @@ -Helper function to sum arguments. — Complex2Real.add • CVXRHelper function to sum arguments. — Complex2Real.add • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,17 @@

Helper function to sum arguments.

Arguments

-
lh_arg
+ + +
lh_arg

The arguments for the left-hand side

-
rh_arg
+
rh_arg

The arguments for the right-hand side

-
neg
+
neg

Whether to negate the right hand side

@@ -96,15 +98,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.at_least_2D.html b/docs/reference/Complex2Real.at_least_2D.html index 0a48f57f..3c191047 100644 --- a/docs/reference/Complex2Real.at_least_2D.html +++ b/docs/reference/Complex2Real.at_least_2D.html @@ -1,9 +1,9 @@ -Upcast 0D and 1D to 2D. — Complex2Real.at_least_2D • CVXRUpcast 0D and 1D to 2D. — Complex2Real.at_least_2D • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Upcast 0D and 1D to 2D.

Arguments

-
expr
+ + +
expr

An Expression object

Value

- - -

An expression of dimension at least 2.

+

An expression of dimension at least 2.

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.binary_canon.html b/docs/reference/Complex2Real.binary_canon.html index b60a1716..33782bd6 100644 --- a/docs/reference/Complex2Real.binary_canon.html +++ b/docs/reference/Complex2Real.binary_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the binary atom — Complex2Real.binary_canon • CVXRComplex canonicalizer for the binary atom — Complex2Real.binary_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the binary atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a binary atom, where the returned +

A canonicalization of a binary atom, where the returned variables are the real component and the imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.canonicalize_expr.html b/docs/reference/Complex2Real.canonicalize_expr.html index 8633a77f..d78e482c 100644 --- a/docs/reference/Complex2Real.canonicalize_expr.html +++ b/docs/reference/Complex2Real.canonicalize_expr.html @@ -1,9 +1,9 @@ -Canonicalizes a Complex Expression — Complex2Real.canonicalize_expr • CVXRCanonicalizes a Complex Expression — Complex2Real.canonicalize_expr • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,31 +71,31 @@

Canonicalizes a Complex Expression

Arguments

-
expr
+ + +
expr

An Expression object.

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression.

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression.

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

-
leaf_map
+
leaf_map

A map that consists of a tree representation of the overall expression

Value

- - -

A list of the parsed out real and imaginary components of the expression at hand.

+

A list of the parsed out real and imaginary components of the expression at hand.

@@ -110,15 +110,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.canonicalize_tree.html b/docs/reference/Complex2Real.canonicalize_tree.html index fd28c2f8..1e065edf 100644 --- a/docs/reference/Complex2Real.canonicalize_tree.html +++ b/docs/reference/Complex2Real.canonicalize_tree.html @@ -1,9 +1,9 @@ -Recursively Canonicalizes a Complex Expression. — Complex2Real.canonicalize_tree • CVXRRecursively Canonicalizes a Complex Expression. — Complex2Real.canonicalize_tree • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Recursively Canonicalizes a Complex Expression.

Arguments

-
expr
+ + +
expr

An Expression object.

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

-
leaf_map
+
leaf_map

A map that consists of a tree representation of the expression.

Value

- - -

A list of the parsed out real and imaginary components of the +

A list of the parsed out real and imaginary components of the expression that was constructed by performing the canonicalization of each leaf in the tree.

@@ -104,15 +104,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.conj_canon.html b/docs/reference/Complex2Real.conj_canon.html index 95f11187..72ee2625 100644 --- a/docs/reference/Complex2Real.conj_canon.html +++ b/docs/reference/Complex2Real.conj_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the conjugate atom — Complex2Real.conj_canon • CVXRComplex canonicalizer for the conjugate atom — Complex2Real.conj_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the conjugate atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a conjugate atom, where the returned +

A canonicalization of a conjugate atom, where the returned variables are the real components and negative of the imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.constant_canon.html b/docs/reference/Complex2Real.constant_canon.html index 410f747e..cde74497 100644 --- a/docs/reference/Complex2Real.constant_canon.html +++ b/docs/reference/Complex2Real.constant_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the constant atom — Complex2Real.constant_canon • CVXRComplex canonicalizer for the constant atom — Complex2Real.constant_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,31 +71,29 @@

Complex canonicalizer for the constant atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a constant atom, where the returned -variables are the real component and the imaginary component in the Constant

- - -

atom.

+

A canonicalization of a constant atom, where the returned +variables are the real component and the imaginary component in the Constant +atom.

@@ -110,15 +108,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.hermitian_canon.html b/docs/reference/Complex2Real.hermitian_canon.html index 8f6231f5..b74be063 100644 --- a/docs/reference/Complex2Real.hermitian_canon.html +++ b/docs/reference/Complex2Real.hermitian_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the hermitian atom — Complex2Real.hermitian_canon • CVXRComplex canonicalizer for the hermitian atom — Complex2Real.hermitian_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the hermitian atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a hermitian matrix atom, where the returned +

A canonicalization of a hermitian matrix atom, where the returned variables are the real component and the imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.html b/docs/reference/Complex2Real.html new file mode 100644 index 00000000..15645f58 --- /dev/null +++ b/docs/reference/Complex2Real.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Complex2Real.imag_canon.html b/docs/reference/Complex2Real.imag_canon.html index f0cebc50..fa5c8838 100644 --- a/docs/reference/Complex2Real.imag_canon.html +++ b/docs/reference/Complex2Real.imag_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the imaginary atom — Complex2Real.imag_canon • CVXRComplex canonicalizer for the imaginary atom — Complex2Real.imag_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the imaginary atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of an imaginary atom, where the returned +

A canonicalization of an imaginary atom, where the returned variables are the imaginary component and NULL for the real component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.join.html b/docs/reference/Complex2Real.join.html index b63cfe30..c127457a 100644 --- a/docs/reference/Complex2Real.join.html +++ b/docs/reference/Complex2Real.join.html @@ -1,9 +1,9 @@ -Helper function to combine arguments. — Complex2Real.join • CVXRHelper function to combine arguments. — Complex2Real.join • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Helper function to combine arguments.

Arguments

-
expr
+ + +
expr

An Expression object

-
lh_arg
+
lh_arg

The arguments for the left-hand side

-
rh_arg
+
rh_arg

The arguments for the right-hand side

Value

- - -

A joined expression of both left and right expressions

+

A joined expression of both left and right expressions

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.lambda_sum_largest_canon.html b/docs/reference/Complex2Real.lambda_sum_largest_canon.html index 79621afb..4125d994 100644 --- a/docs/reference/Complex2Real.lambda_sum_largest_canon.html +++ b/docs/reference/Complex2Real.lambda_sum_largest_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the largest sum atom — Complex2Real.lambda_sum_largest_canon • CVXRComplex canonicalizer for the largest sum atom — Complex2Real.lambda_sum_largest_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the largest sum atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of the largest sum atom, where the returned +

A canonicalization of the largest sum atom, where the returned variables are the real component and the imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.matrix_frac_canon.html b/docs/reference/Complex2Real.matrix_frac_canon.html index e129cc76..12b00e90 100644 --- a/docs/reference/Complex2Real.matrix_frac_canon.html +++ b/docs/reference/Complex2Real.matrix_frac_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the matrix fraction atom — Complex2Real.matrix_frac_canon • CVXRComplex canonicalizer for the matrix fraction atom — Complex2Real.matrix_frac_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the matrix fraction atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a matrix atom, where the returned +

A canonicalization of a matrix atom, where the returned variables are converted to real variables.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.nonpos_canon.html b/docs/reference/Complex2Real.nonpos_canon.html index 163984cc..b965f7c3 100644 --- a/docs/reference/Complex2Real.nonpos_canon.html +++ b/docs/reference/Complex2Real.nonpos_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the non-positive atom — Complex2Real.nonpos_canon • CVXRComplex canonicalizer for the non-positive atom — Complex2Real.nonpos_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the non-positive atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a non positive atom, where the returned +

A canonicalization of a non positive atom, where the returned variables are the real component and the imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.norm_nuc_canon.html b/docs/reference/Complex2Real.norm_nuc_canon.html index 0d219680..43b2c36b 100644 --- a/docs/reference/Complex2Real.norm_nuc_canon.html +++ b/docs/reference/Complex2Real.norm_nuc_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the nuclear norm atom — Complex2Real.norm_nuc_canon • CVXRComplex canonicalizer for the nuclear norm atom — Complex2Real.norm_nuc_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the nuclear norm atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a nuclear norm matrix atom, where the returned +

A canonicalization of a nuclear norm matrix atom, where the returned variables are the real component and the imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.param_canon.html b/docs/reference/Complex2Real.param_canon.html index aa303d7a..d0cd9ab9 100644 --- a/docs/reference/Complex2Real.param_canon.html +++ b/docs/reference/Complex2Real.param_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the parameter matrix atom — Complex2Real.param_canon • CVXRComplex canonicalizer for the parameter matrix atom — Complex2Real.param_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the parameter matrix atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a parameter matrix atom, where the returned +

A canonicalization of a parameter matrix atom, where the returned variables are the real component and the imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.pnorm_canon.html b/docs/reference/Complex2Real.pnorm_canon.html index 37325d1b..24d28992 100644 --- a/docs/reference/Complex2Real.pnorm_canon.html +++ b/docs/reference/Complex2Real.pnorm_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the p norm atom — Complex2Real.pnorm_canon • CVXRComplex canonicalizer for the p norm atom — Complex2Real.pnorm_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the p norm atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a pnorm atom, where the returned +

A canonicalization of a pnorm atom, where the returned variables are the real component and the NULL imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.psd_canon.html b/docs/reference/Complex2Real.psd_canon.html index e82f22bf..3d9d2e61 100644 --- a/docs/reference/Complex2Real.psd_canon.html +++ b/docs/reference/Complex2Real.psd_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the positive semidefinite atom — Complex2Real.psd_canon • CVXRComplex canonicalizer for the positive semidefinite atom — Complex2Real.psd_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the positive semidefinite atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a positive semidefinite atom, where the returned +

A canonicalization of a positive semidefinite atom, where the returned variables are the real component and the NULL imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.quad_canon.html b/docs/reference/Complex2Real.quad_canon.html index 24e41589..a85d21f7 100644 --- a/docs/reference/Complex2Real.quad_canon.html +++ b/docs/reference/Complex2Real.quad_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the quadratic atom — Complex2Real.quad_canon • CVXRComplex canonicalizer for the quadratic atom — Complex2Real.quad_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the quadratic atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a quadratic atom, where the returned +

A canonicalization of a quadratic atom, where the returned variables are the real component and the imaginary component as NULL.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.quad_over_lin_canon.html b/docs/reference/Complex2Real.quad_over_lin_canon.html index 7b30e357..fd938d91 100644 --- a/docs/reference/Complex2Real.quad_over_lin_canon.html +++ b/docs/reference/Complex2Real.quad_over_lin_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the quadratic over linear term atom — Complex2Real.quad_over_lin_canon • CVXRComplex canonicalizer for the quadratic over linear term atom — Complex2Real.quad_over_lin_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the quadratic over linear term atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a quadratic over a linear term atom, where the returned +

A canonicalization of a quadratic over a linear term atom, where the returned variables are the real component and the imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.real_canon.html b/docs/reference/Complex2Real.real_canon.html index 3cb8d6d7..569eafaa 100644 --- a/docs/reference/Complex2Real.real_canon.html +++ b/docs/reference/Complex2Real.real_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the real atom — Complex2Real.real_canon • CVXRComplex canonicalizer for the real atom — Complex2Real.real_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the real atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a real atom, where the returned +

A canonicalization of a real atom, where the returned variables are the real component and NULL for the imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.separable_canon.html b/docs/reference/Complex2Real.separable_canon.html index c5097e87..af6fdbb8 100644 --- a/docs/reference/Complex2Real.separable_canon.html +++ b/docs/reference/Complex2Real.separable_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the separable atom — Complex2Real.separable_canon • CVXRComplex canonicalizer for the separable atom — Complex2Real.separable_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the separable atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a separable atom, where the returned +

A canonicalization of a separable atom, where the returned variables are its real and imaginary components parsed out.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.soc_canon.html b/docs/reference/Complex2Real.soc_canon.html index ecef3bbd..a29f1747 100644 --- a/docs/reference/Complex2Real.soc_canon.html +++ b/docs/reference/Complex2Real.soc_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the SOC atom — Complex2Real.soc_canon • CVXRComplex canonicalizer for the SOC atom — Complex2Real.soc_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the SOC atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a SOC atom, where the returned +

A canonicalization of a SOC atom, where the returned variables are the real component and the NULL imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.variable_canon.html b/docs/reference/Complex2Real.variable_canon.html index a7661d8a..fbdf3f80 100644 --- a/docs/reference/Complex2Real.variable_canon.html +++ b/docs/reference/Complex2Real.variable_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the variable atom — Complex2Real.variable_canon • CVXRComplex canonicalizer for the variable atom — Complex2Real.variable_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the variable atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a variable atom, where the returned +

A canonicalization of a variable atom, where the returned variables are the real component and the NULL imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Complex2Real.zero_canon.html b/docs/reference/Complex2Real.zero_canon.html index 0eb60055..6a1522ba 100644 --- a/docs/reference/Complex2Real.zero_canon.html +++ b/docs/reference/Complex2Real.zero_canon.html @@ -1,9 +1,9 @@ -Complex canonicalizer for the zero atom — Complex2Real.zero_canon • CVXRComplex canonicalizer for the zero atom — Complex2Real.zero_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Complex canonicalizer for the zero atom

Arguments

-
expr
+ + +
expr

An Expression object

-
real_args
+
real_args

A list of Constraint objects for the real part of the expression

-
imag_args
+
imag_args

A list of Constraint objects for the imaginary part of the expression

-
real2imag
+
real2imag

A list mapping the ID of the real part of a complex expression to the ID of its imaginary part.

Value

- - -

A canonicalization of a zero atom, where the returned +

A canonicalization of a zero atom, where the returned variables are the real component and the imaginary component.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ConeDims-class.html b/docs/reference/ConeDims-class.html index cbfbbcef..2a5f283e 100644 --- a/docs/reference/ConeDims-class.html +++ b/docs/reference/ConeDims-class.html @@ -1,10 +1,10 @@ Summary of cone dimensions present in constraints. — ConeDims-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -71,7 +71,7 @@

Summary of cone dimensions present in constraints.

Details

Attributes - ---------- + ———- zero : int The dimension of the zero cone. nonpos : int @@ -97,15 +97,15 @@

Details

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ConeMatrixStuffing-class.html b/docs/reference/ConeMatrixStuffing-class.html index ad3315d3..255fe9e2 100644 --- a/docs/reference/ConeMatrixStuffing-class.html +++ b/docs/reference/ConeMatrixStuffing-class.html @@ -1,10 +1,10 @@ Construct Matrices for Linear Cone Problems — ConeMatrixStuffing-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -68,24 +68,26 @@

Construct Matrices for Linear Cone Problems

-
# S4 method for ConeMatrixStuffing,Problem
+    
# S4 method for class 'ConeMatrixStuffing,Problem'
 accepts(object, problem)
 
-# S4 method for ConeMatrixStuffing,Problem,CoeffExtractor
+# S4 method for class 'ConeMatrixStuffing,Problem,CoeffExtractor'
 stuffed_objective(object, problem, extractor)

Arguments

-
object
+ + +
object

A ConeMatrixStuffing object.

-
problem
+
problem

A Problem object.

-
extractor
+
extractor

Used to extract the affine coefficients of the objective.

@@ -98,7 +100,7 @@

Details

Methods (by generic)

- +
  • accepts(object = ConeMatrixStuffing, problem = Problem): Is the solver accepted?

  • stuffed_objective( object = ConeMatrixStuffing, @@ -119,15 +121,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ConeMatrixStuffing.html b/docs/reference/ConeMatrixStuffing.html new file mode 100644 index 00000000..f162fa40 --- /dev/null +++ b/docs/reference/ConeMatrixStuffing.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/ConicSolver-class.html b/docs/reference/ConicSolver-class.html index 852857bd..a65feb73 100644 --- a/docs/reference/ConicSolver-class.html +++ b/docs/reference/ConicSolver-class.html @@ -1,9 +1,9 @@ -The ConicSolver class. — ConicSolver-class • CVXRThe ConicSolver class. — ConicSolver-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,52 +66,54 @@

The ConicSolver class.

-
# S4 method for ConicSolver,Problem
+    
# S4 method for class 'ConicSolver,Problem'
 accepts(object, problem)
 
-# S4 method for ConicSolver
+# S4 method for class 'ConicSolver'
 reduction_format_constr(object, problem, constr, exp_cone_order)
 
-# S4 method for ConicSolver
+# S4 method for class 'ConicSolver'
 group_coeff_offset(object, problem, constraints, exp_cone_order)
 
-# S4 method for ConicSolver,Solution,InverseData
+# S4 method for class 'ConicSolver,Solution,InverseData'
 invert(object, solution, inverse_data)

Arguments

-
object
+ + +
object

A ConicSolver object.

-
problem
+
problem

A Problem object.

-
constr
+
constr

A Constraint to format.

-
exp_cone_order
+
exp_cone_order

A list indicating how the exponential cone arguments are ordered.

-
constraints
+
constraints

A list of Constraint objects.

-
solution
+
solution

A Solution object to invert.

-
inverse_data
+
inverse_data

A InverseData object containing data necessary for the inversion.

Methods (by generic)

- +
  • accepts(object = ConicSolver, problem = Problem): Can the problem be solved with a conic solver?

  • reduction_format_constr(ConicSolver): Return a list representing a cone program whose problem data tensors will yield the coefficient "A" and offset "b" for the respective constraints: @@ -136,15 +138,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ConicSolver.get_coeff_offset.html b/docs/reference/ConicSolver.get_coeff_offset.html index 71896e56..4aac53e8 100644 --- a/docs/reference/ConicSolver.get_coeff_offset.html +++ b/docs/reference/ConicSolver.get_coeff_offset.html @@ -1,9 +1,9 @@ -Return the coefficient and offset in \(Ax + b\). — ConicSolver.get_coeff_offset • CVXRReturn the coefficient and offset in \(Ax + b\). — ConicSolver.get_coeff_offset • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Return the coefficient and offset in \(Ax + b\).

Arguments

-
expr
+ + +
expr

An Expression object.

Value

- - -

The coefficient and offset in \(Ax + b\).

+

The coefficient and offset in \(Ax + b\).

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ConicSolver.get_spacing_matrix.html b/docs/reference/ConicSolver.get_spacing_matrix.html index 3df97504..8a95461d 100644 --- a/docs/reference/ConicSolver.get_spacing_matrix.html +++ b/docs/reference/ConicSolver.get_spacing_matrix.html @@ -1,9 +1,9 @@ -Returns a sparse matrix that spaces out an expression. — ConicSolver.get_spacing_matrix • CVXRReturns a sparse matrix that spaces out an expression. — ConicSolver.get_spacing_matrix • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Returns a sparse matrix that spaces out an expression.

Arguments

-
dim
+ + +
dim

A vector outlining the dimensions of the matrix.

-
spacing
+
spacing

An int of the number of rows between the start of each non-zero block.

-
offset
+
offset

An int of the number of zeros at the beginning of the matrix.

Value

- - -

A sparse matrix that spaces out an expression

+

A sparse matrix that spaces out an expression

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ConicSolver.html b/docs/reference/ConicSolver.html new file mode 100644 index 00000000..0143e4e5 --- /dev/null +++ b/docs/reference/ConicSolver.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Conj,Expression-method.html b/docs/reference/Conj,Expression-method.html new file mode 100644 index 00000000..654227e9 --- /dev/null +++ b/docs/reference/Conj,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Conjugate-class.html b/docs/reference/Conjugate-class.html index eda24ec5..ce01ef08 100644 --- a/docs/reference/Conjugate-class.html +++ b/docs/reference/Conjugate-class.html @@ -1,9 +1,9 @@ -The Conjugate class. — Conjugate-class • CVXRThe Conjugate class. — Conjugate-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,46 +68,48 @@

The Conjugate class.

Conjugate(expr)
 
-# S4 method for Conjugate
+# S4 method for class 'Conjugate'
 to_numeric(object, values)
 
-# S4 method for Conjugate
+# S4 method for class 'Conjugate'
 dim_from_args(object)
 
-# S4 method for Conjugate
+# S4 method for class 'Conjugate'
 is_incr(object, idx)
 
-# S4 method for Conjugate
+# S4 method for class 'Conjugate'
 is_decr(object, idx)
 
-# S4 method for Conjugate
+# S4 method for class 'Conjugate'
 is_symmetric(object)
 
-# S4 method for Conjugate
+# S4 method for class 'Conjugate'
 is_hermitian(object)

Arguments

-
expr
+ + +
expr

An Expression or R numeric data.

-
object
+
object

A Conjugate object.

-
values
+
values

A list of arguments to the atom.

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(Conjugate): Elementwise complex conjugate of the constant.

  • dim_from_args(Conjugate): The (row, col) dimensions of the expression.

  • is_incr(Conjugate): Is the composition weakly increasing in argument idx?

  • @@ -117,7 +119,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression or R numeric data.

@@ -137,15 +139,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Conjugate.html b/docs/reference/Conjugate.html new file mode 100644 index 00000000..2be5e9ec --- /dev/null +++ b/docs/reference/Conjugate.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Constant-class.html b/docs/reference/Constant-class.html index e35b9c71..c0f5e5ed 100644 --- a/docs/reference/Constant-class.html +++ b/docs/reference/Constant-class.html @@ -1,10 +1,10 @@ The Constant class. — Constant-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -70,52 +70,52 @@

The Constant class.

Constant(value)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 show(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 name(x)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 constants(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 value(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 is_pos(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 grad(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 dim(x)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 canonicalize(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 is_nonneg(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 is_nonpos(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 is_imag(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 is_complex(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 is_symmetric(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 is_hermitian(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 is_psd(object)
 
-# S4 method for Constant
+# S4 method for class 'Constant'
 is_nsd(object)
 
 as.Constant(expr)
@@ -123,27 +123,27 @@

The Constant class.

Arguments

-
value
+ + +
value

A numeric element, vector, matrix, or data.frame. Vectors are automatically cast into a matrix column.

-
x, object
+
x, object

A Constant object.

-
expr
+
expr

An Expression, numeric element, vector, matrix, or data.frame.

Value

- - -

A Constant representing the input as a constant.

+

A Constant representing the input as a constant.

Methods (by generic)

- +
  • name(Constant): The name of the constant.

  • constants(Constant): Returns itself as a constant.

  • value(Constant): The value of the constant.

  • @@ -162,7 +162,7 @@

    Methods (by generic)

Slots

- +
value

A numeric element, vector, matrix, or data.frame. Vectors are automatically cast into a matrix column.

@@ -213,15 +213,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Constant.html b/docs/reference/Constant.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/Constant.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/ConstantSolver-class.html b/docs/reference/ConstantSolver-class.html index ae3330aa..dd23c302 100644 --- a/docs/reference/ConstantSolver-class.html +++ b/docs/reference/ConstantSolver-class.html @@ -1,9 +1,9 @@ -The ConstantSolver class. — ConstantSolver-class • CVXRThe ConstantSolver class. — ConstantSolver-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,28 +66,28 @@

The ConstantSolver class.

-
# S4 method for ConstantSolver
+    
# S4 method for class 'ConstantSolver'
 mip_capable(solver)
 
-# S4 method for ConstantSolver,Problem
+# S4 method for class 'ConstantSolver,Problem'
 accepts(object, problem)
 
-# S4 method for ConstantSolver,Problem
+# S4 method for class 'ConstantSolver,Problem'
 perform(object, problem)
 
-# S4 method for ConstantSolver,Solution,list
+# S4 method for class 'ConstantSolver,Solution,list'
 invert(object, solution, inverse_data)
 
-# S4 method for ConstantSolver
+# S4 method for class 'ConstantSolver'
 name(x)
 
-# S4 method for ConstantSolver
+# S4 method for class 'ConstantSolver'
 import_solver(solver)
 
-# S4 method for ConstantSolver
+# S4 method for class 'ConstantSolver'
 is_installed(solver)
 
-# S4 method for ConstantSolver
+# S4 method for class 'ConstantSolver'
 solve_via_data(
   object,
   data,
@@ -101,67 +101,69 @@ 

The ConstantSolver class.

solver_cache ) -# S4 method for ConstantSolver,ANY +# S4 method for class 'ConstantSolver,ANY' reduction_solve(object, problem, warm_start, verbose, solver_opts)

Arguments

-
solver, object, x
+ + +
solver, object, x

A ConstantSolver object.

-
problem
+
problem

A Problem object.

-
solution
+
solution

A Solution object to invert.

-
inverse_data
+
inverse_data

A list containing data necessary for the inversion.

-
data
+
data

Data for the solver.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance.

-
reltol
+
reltol

The relative tolerance.

-
abstol
+
abstol

The absolute tolerance.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(ConstantSolver): Can the solver handle mixed-integer programs?

  • accepts(object = ConstantSolver, problem = Problem): Is the solver capable of solving the problem?

  • perform(object = ConstantSolver, problem = Problem): Returns a list of the ConstantSolver, Problem, and an empty list.

  • @@ -185,15 +187,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ConstantSolver.html b/docs/reference/ConstantSolver.html new file mode 100644 index 00000000..563daa80 --- /dev/null +++ b/docs/reference/ConstantSolver.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Constraint-class.html b/docs/reference/Constraint-class.html index 1b01d9c0..1147686d 100644 --- a/docs/reference/Constraint-class.html +++ b/docs/reference/Constraint-class.html @@ -1,9 +1,9 @@ -The Constraint class. — Constraint-class • CVXRThe Constraint class. — Constraint-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,69 +66,71 @@

The Constraint class.

-
# S4 method for Constraint
+    
# S4 method for class 'Constraint'
 as.character(x)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 dim(x)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 size(object)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 is_real(object)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 is_imag(object)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 is_complex(object)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 is_dcp(object)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 is_dgp(object)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 residual(object)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 violation(object)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 constr_value(object, tolerance = 1e-08)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 get_data(object)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 dual_value(object)
 
-# S4 method for Constraint
+# S4 method for class 'Constraint'
 dual_value(object) <- value
 
-# S4 method for ZeroConstraint
+# S4 method for class 'ZeroConstraint'
 size(object)

Arguments

-
x, object
+ + +
x, object

A Constraint object.

-
tolerance
+
tolerance

The tolerance for checking if the constraint is violated.

-
value
+
value

A numeric scalar, vector, or matrix.

Methods (by generic)

- +
  • dim(Constraint): The dimensions of the constrained expression.

  • size(Constraint): The size of the constrained expression.

  • is_real(Constraint): Is the constraint real?

  • @@ -157,15 +159,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Constraint.html b/docs/reference/Constraint.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/Constraint.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Conv-class.html b/docs/reference/Conv-class.html index 5c8e4ff1..4af82db3 100644 --- a/docs/reference/Conv-class.html +++ b/docs/reference/Conv-class.html @@ -1,9 +1,9 @@ -The Conv class. — Conv-class • CVXRThe Conv class. — Conv-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,65 +68,67 @@

The Conv class.

Conv(lh_exp, rh_exp)
 
-# S4 method for Conv
+# S4 method for class 'Conv'
 to_numeric(object, values)
 
-# S4 method for Conv
+# S4 method for class 'Conv'
 validate_args(object)
 
-# S4 method for Conv
+# S4 method for class 'Conv'
 dim_from_args(object)
 
-# S4 method for Conv
+# S4 method for class 'Conv'
 sign_from_args(object)
 
-# S4 method for Conv
+# S4 method for class 'Conv'
 is_incr(object, idx)
 
-# S4 method for Conv
+# S4 method for class 'Conv'
 is_decr(object, idx)
 
-# S4 method for Conv
+# S4 method for class 'Conv'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
lh_exp
+ + +
lh_exp

An Expression or R numeric data representing the left-hand vector.

-
rh_exp
+
rh_exp

An Expression or R numeric data representing the right-hand vector.

-
object
+
object

A Conv object.

-
values
+
values

A list of arguments to the atom.

-
idx
+
idx

An index into the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(Conv): The convolution of the two values.

  • validate_args(Conv): Check both arguments are vectors and the first is a constant.

  • dim_from_args(Conv): The dimensions of the atom.

  • @@ -137,7 +139,7 @@

    Methods (by generic)

Slots

- +
lh_exp

An Expression or R numeric data representing the left-hand vector.

@@ -161,15 +163,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CumMax-class.html b/docs/reference/CumMax-class.html index be90adf3..79e19d12 100644 --- a/docs/reference/CumMax-class.html +++ b/docs/reference/CumMax-class.html @@ -1,9 +1,9 @@ -The CumMax class. — CumMax-class • CVXRThe CumMax class. — CumMax-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,66 +68,68 @@

The CumMax class.

CumMax(expr, axis = 2)
 
-# S4 method for CumMax
+# S4 method for class 'CumMax'
 to_numeric(object, values)
 
-# S4 method for CumMax
+# S4 method for class 'CumMax'
 .grad(object, values)
 
-# S4 method for CumMax
+# S4 method for class 'CumMax'
 .column_grad(object, value)
 
-# S4 method for CumMax
+# S4 method for class 'CumMax'
 dim_from_args(object)
 
-# S4 method for CumMax
+# S4 method for class 'CumMax'
 sign_from_args(object)
 
-# S4 method for CumMax
+# S4 method for class 'CumMax'
 get_data(object)
 
-# S4 method for CumMax
+# S4 method for class 'CumMax'
 is_atom_convex(object)
 
-# S4 method for CumMax
+# S4 method for class 'CumMax'
 is_atom_concave(object)
 
-# S4 method for CumMax
+# S4 method for class 'CumMax'
 is_incr(object, idx)
 
-# S4 method for CumMax
+# S4 method for class 'CumMax'
 is_decr(object, idx)

Arguments

-
expr
+ + +
expr

An Expression.

-
axis
+
axis

A numeric vector indicating the axes along which to apply the function. For a 2D matrix, 1 indicates rows, 2 indicates columns, and c(1,2) indicates rows and columns.

-
object
+
object

A CumMax object.

-
values
+
values

A list of numeric values for the arguments

-
value
+
value

A numeric value.

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(CumMax): The cumulative maximum along the axis.

  • .grad(CumMax): Gives the (sub/super)gradient of the atom w.r.t. each variable

  • .column_grad(CumMax): Gives the (sub/super)gradient of the atom w.r.t. each column variable

  • @@ -141,7 +143,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression.

@@ -165,15 +167,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CumSum-class.html b/docs/reference/CumSum-class.html index 676cfeb3..60f33073 100644 --- a/docs/reference/CumSum-class.html +++ b/docs/reference/CumSum-class.html @@ -1,9 +1,9 @@ -The CumSum class. — CumSum-class • CVXRThe CumSum class. — CumSum-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,55 +68,57 @@

The CumSum class.

CumSum(expr, axis = 2)
 
-# S4 method for CumSum
+# S4 method for class 'CumSum'
 to_numeric(object, values)
 
-# S4 method for CumSum
+# S4 method for class 'CumSum'
 dim_from_args(object)
 
-# S4 method for CumSum
+# S4 method for class 'CumSum'
 get_data(object)
 
-# S4 method for CumSum
+# S4 method for class 'CumSum'
 .grad(object, values)
 
-# S4 method for CumSum
+# S4 method for class 'CumSum'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
expr
+ + +
expr

An Expression to be summed.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, and 2 indicates columns. The default is 2.

-
object
+
object

A CumSum object.

-
values
+
values

A list of numeric values for the arguments

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(CumSum): The cumulative sum of the values along the specified axis.

  • dim_from_args(CumSum): The dimensions of the atom.

  • get_data(CumSum): Returns the axis along which the cumulative sum is taken.

  • @@ -125,7 +127,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression to be summed.

@@ -149,15 +151,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CvxAttr2Constr-class.html b/docs/reference/CvxAttr2Constr-class.html index a19522b2..7aa792e8 100644 --- a/docs/reference/CvxAttr2Constr-class.html +++ b/docs/reference/CvxAttr2Constr-class.html @@ -1,9 +1,9 @@ -The CvxAttr2Constr class. — CvxAttr2Constr-class • CVXRThe CvxAttr2Constr class. — CvxAttr2Constr-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,34 +66,36 @@

The CvxAttr2Constr class.

-
# S4 method for CvxAttr2Constr,Problem
+    
# S4 method for class 'CvxAttr2Constr,Problem'
 perform(object, problem)
 
-# S4 method for CvxAttr2Constr,Solution,list
+# S4 method for class 'CvxAttr2Constr,Solution,list'
 invert(object, solution, inverse_data)

Arguments

-
object
+ + +
object

A CvxAttr2Constr object.

-
problem
+
problem

A Problem object.

-
solution
+
solution

A Solution to a problem that generated the inverse data.

-
inverse_data
+
inverse_data

The inverse data returned by an invocation to apply.

Methods (by generic)

- +
  • perform(object = CvxAttr2Constr, problem = Problem): Expand convex variable attributes to constraints.

  • invert(object = CvxAttr2Constr, solution = Solution, inverse_data = list): Performs the reduction on a problem and returns an equivalent problem.

@@ -110,15 +112,15 @@

Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/CvxAttr2Constr.html b/docs/reference/CvxAttr2Constr.html new file mode 100644 index 00000000..86e93a93 --- /dev/null +++ b/docs/reference/CvxAttr2Constr.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Dcp2Cone-class.html b/docs/reference/Dcp2Cone-class.html index 2c8a0c40..c3b67357 100644 --- a/docs/reference/Dcp2Cone-class.html +++ b/docs/reference/Dcp2Cone-class.html @@ -1,10 +1,10 @@ Reduce DCP Problem to Conic Form — Dcp2Cone-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -68,26 +68,28 @@

Reduce DCP Problem to Conic Form

-
# S4 method for Dcp2Cone,Problem
+    
# S4 method for class 'Dcp2Cone,Problem'
 accepts(object, problem)
 
-# S4 method for Dcp2Cone,Problem
+# S4 method for class 'Dcp2Cone,Problem'
 perform(object, problem)

Arguments

-
object
+ + +
object

A Dcp2Cone object.

-
problem
+
problem

A Problem object.

Methods (by generic)

- +
  • accepts(object = Dcp2Cone, problem = Problem): A problem is accepted if it is a minimization and is DCP.

  • perform(object = Dcp2Cone, problem = Problem): Converts a DCP problem to a conic form.

@@ -104,15 +106,15 @@

Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.entr_canon.html b/docs/reference/Dcp2Cone.entr_canon.html index 26162c6e..216f8058 100644 --- a/docs/reference/Dcp2Cone.entr_canon.html +++ b/docs/reference/Dcp2Cone.entr_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the entropy atom — Dcp2Cone.entr_canon • CVXRDcp2Cone canonicalizer for the entropy atom — Dcp2Cone.entr_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the entropy atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from an entropy atom where +

A cone program constructed from an entropy atom where the objective function is just the variable t with an ExpCone constraint.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.exp_canon.html b/docs/reference/Dcp2Cone.exp_canon.html index 297a03e8..2baa70f0 100644 --- a/docs/reference/Dcp2Cone.exp_canon.html +++ b/docs/reference/Dcp2Cone.exp_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the exponential atom — Dcp2Cone.exp_canon • CVXRDcp2Cone canonicalizer for the exponential atom — Dcp2Cone.exp_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the exponential atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from an exponential atom +

A cone program constructed from an exponential atom where the objective function is the variable t with an ExpCone constraint.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.geo_mean_canon.html b/docs/reference/Dcp2Cone.geo_mean_canon.html index 4634fb13..de3096f9 100644 --- a/docs/reference/Dcp2Cone.geo_mean_canon.html +++ b/docs/reference/Dcp2Cone.geo_mean_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the geometric mean atom — Dcp2Cone.geo_mean_canon • CVXRDcp2Cone canonicalizer for the geometric mean atom — Dcp2Cone.geo_mean_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the geometric mean atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a geometric mean atom +

A cone program constructed from a geometric mean atom where the objective function is the variable t with geometric mean constraints

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.huber_canon.html b/docs/reference/Dcp2Cone.huber_canon.html index 3958d01d..5035be6e 100644 --- a/docs/reference/Dcp2Cone.huber_canon.html +++ b/docs/reference/Dcp2Cone.huber_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the huber atom — Dcp2Cone.huber_canon • CVXRDcp2Cone canonicalizer for the huber atom — Dcp2Cone.huber_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the huber atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a huber atom where the objective +

A cone program constructed from a huber atom where the objective function is the variable t with square and absolute constraints

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.indicator_canon.html b/docs/reference/Dcp2Cone.indicator_canon.html index 49b816a3..7e13c965 100644 --- a/docs/reference/Dcp2Cone.indicator_canon.html +++ b/docs/reference/Dcp2Cone.indicator_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the indicator atom — Dcp2Cone.indicator_canon • CVXRDcp2Cone canonicalizer for the indicator atom — Dcp2Cone.indicator_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the indicator atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from an indicator atom and +

A cone program constructed from an indicator atom and where 0 is the objective function with the given constraints in the function.

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.kl_div_canon.html b/docs/reference/Dcp2Cone.kl_div_canon.html index c6cd9191..51d580d8 100644 --- a/docs/reference/Dcp2Cone.kl_div_canon.html +++ b/docs/reference/Dcp2Cone.kl_div_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the KL Divergence atom — Dcp2Cone.kl_div_canon • CVXRDcp2Cone canonicalizer for the KL Divergence atom — Dcp2Cone.kl_div_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the KL Divergence atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a KL divergence atom +

A cone program constructed from a KL divergence atom where t is the objective function with the ExpCone constraints.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.lambda_max_canon.html b/docs/reference/Dcp2Cone.lambda_max_canon.html index 79d869fd..baa9adb0 100644 --- a/docs/reference/Dcp2Cone.lambda_max_canon.html +++ b/docs/reference/Dcp2Cone.lambda_max_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the lambda maximization atom — Dcp2Cone.lambda_max_canon • CVXRDcp2Cone canonicalizer for the lambda maximization atom — Dcp2Cone.lambda_max_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the lambda maximization atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a lambda maximization atom +

A cone program constructed from a lambda maximization atom where t is the objective function and a PSD constraint and a constraint requiring I*t to be symmetric.

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.lambda_sum_largest_canon.html b/docs/reference/Dcp2Cone.lambda_sum_largest_canon.html index a0f95f55..a300e693 100644 --- a/docs/reference/Dcp2Cone.lambda_sum_largest_canon.html +++ b/docs/reference/Dcp2Cone.lambda_sum_largest_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the largest lambda sum atom — Dcp2Cone.lambda_sum_largest_canon • CVXRDcp2Cone canonicalizer for the largest lambda sum atom — Dcp2Cone.lambda_sum_largest_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the largest lambda sum atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a lambda sum of the k +

A cone program constructed from a lambda sum of the k largest elements atom where k*t + trace(Z) is the objective function. t denotes the variable subject to constraints and Z is a PSD matrix variable whose dimensions consist of the length of the vector at hand. The constraints @@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.log1p_canon.html b/docs/reference/Dcp2Cone.log1p_canon.html index 34a34053..1fea79a3 100644 --- a/docs/reference/Dcp2Cone.log1p_canon.html +++ b/docs/reference/Dcp2Cone.log1p_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the log 1p atom — Dcp2Cone.log1p_canon • CVXRDcp2Cone canonicalizer for the log 1p atom — Dcp2Cone.log1p_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the log 1p atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a log 1p atom where +

A cone program constructed from a log 1p atom where t is the objective function and the constraints consist of ExpCone constraints + 1.

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.log_canon.html b/docs/reference/Dcp2Cone.log_canon.html index 4863b1c8..3f26bc6a 100644 --- a/docs/reference/Dcp2Cone.log_canon.html +++ b/docs/reference/Dcp2Cone.log_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the log atom — Dcp2Cone.log_canon • CVXRDcp2Cone canonicalizer for the log atom — Dcp2Cone.log_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the log atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a log atom where +

A cone program constructed from a log atom where t is the objective function and the constraints consist of ExpCone constraints

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.log_det_canon.html b/docs/reference/Dcp2Cone.log_det_canon.html index b17031b1..ceffd5e8 100644 --- a/docs/reference/Dcp2Cone.log_det_canon.html +++ b/docs/reference/Dcp2Cone.log_det_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the log determinant atom — Dcp2Cone.log_det_canon • CVXRDcp2Cone canonicalizer for the log determinant atom — Dcp2Cone.log_det_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the log determinant atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a log determinant atom where +

A cone program constructed from a log determinant atom where the objective function is the sum of the log of the vector D and the constraints consist of requiring the matrix Z to be diagonal and the diagonal Z to equal D, Z to be upper triangular @@ -103,15 +103,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.log_sum_exp_canon.html b/docs/reference/Dcp2Cone.log_sum_exp_canon.html index 5a422b88..651dfb0b 100644 --- a/docs/reference/Dcp2Cone.log_sum_exp_canon.html +++ b/docs/reference/Dcp2Cone.log_sum_exp_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the log sum of the exp atom — Dcp2Cone.log_sum_exp_canon • CVXRDcp2Cone canonicalizer for the log sum of the exp atom — Dcp2Cone.log_sum_exp_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the log sum of the exp atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from the log sum +

A cone program constructed from the log sum of the exp atom where the objective is the t variable and the constraints consist of the ExpCone constraints and requiring t to be less than a matrix of ones of the same size.

@@ -101,15 +101,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.logistic_canon.html b/docs/reference/Dcp2Cone.logistic_canon.html index 770a07e3..57b7de07 100644 --- a/docs/reference/Dcp2Cone.logistic_canon.html +++ b/docs/reference/Dcp2Cone.logistic_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the logistic function atom — Dcp2Cone.logistic_canon • CVXRDcp2Cone canonicalizer for the logistic function atom — Dcp2Cone.logistic_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,20 +71,20 @@

Dcp2Cone canonicalizer for the logistic function atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from the logistic atom -where the objective function is given by t0 and the +

A cone program constructed from the logistic atom +where the objective function is given by t0 and the constraints consist of the ExpCone constraints.

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.matrix_frac_canon.html b/docs/reference/Dcp2Cone.matrix_frac_canon.html index 98da9fca..2003032e 100644 --- a/docs/reference/Dcp2Cone.matrix_frac_canon.html +++ b/docs/reference/Dcp2Cone.matrix_frac_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the matrix fraction atom — Dcp2Cone.matrix_frac_canon • CVXRDcp2Cone canonicalizer for the matrix fraction atom — Dcp2Cone.matrix_frac_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,20 +71,20 @@

Dcp2Cone canonicalizer for the matrix fraction atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from the matrix fraction -atom, where the objective function is the trace of Tvar, a +

A cone program constructed from the matrix fraction +atom, where the objective function is the trace of Tvar, a m by m matrix where the constraints consist of the matrix of the Schur complement of Tvar to consist of P, an n by n, given matrix, X, an n by m given matrix, and Tvar.

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.normNuc_canon.html b/docs/reference/Dcp2Cone.normNuc_canon.html index c84cb666..79a4b8c3 100644 --- a/docs/reference/Dcp2Cone.normNuc_canon.html +++ b/docs/reference/Dcp2Cone.normNuc_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the nuclear norm atom — Dcp2Cone.normNuc_canon • CVXRDcp2Cone canonicalizer for the nuclear norm atom — Dcp2Cone.normNuc_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the nuclear norm atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a nuclear norm atom, +

A cone program constructed from a nuclear norm atom, where the objective function consists of .5 times the trace of a matrix X of size m+n by m+n where the constraint consist of the top right corner of the matrix being the original matrix.

@@ -101,15 +101,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.pnorm_canon.html b/docs/reference/Dcp2Cone.pnorm_canon.html index 8a8f727b..7812785a 100644 --- a/docs/reference/Dcp2Cone.pnorm_canon.html +++ b/docs/reference/Dcp2Cone.pnorm_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the p norm atom — Dcp2Cone.pnorm_canon • CVXRDcp2Cone canonicalizer for the p norm atom — Dcp2Cone.pnorm_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the p norm atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a pnorm atom, where +

A cone program constructed from a pnorm atom, where the objective is a variable t of dimension of the original vector in the problem and the constraints consist of geometric mean constraints.

@@ -101,15 +101,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.power_canon.html b/docs/reference/Dcp2Cone.power_canon.html index e4145cc0..41c564f4 100644 --- a/docs/reference/Dcp2Cone.power_canon.html +++ b/docs/reference/Dcp2Cone.power_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the power atom — Dcp2Cone.power_canon • CVXRDcp2Cone canonicalizer for the power atom — Dcp2Cone.power_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the power atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a power atom, where +

A cone program constructed from a power atom, where the objective function consists of the variable t which is of the dimension of the original vector from the power atom and the constraints consists of geometric mean constraints.

@@ -101,15 +101,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.quad_form_canon.html b/docs/reference/Dcp2Cone.quad_form_canon.html index 208412c4..7b6648fb 100644 --- a/docs/reference/Dcp2Cone.quad_form_canon.html +++ b/docs/reference/Dcp2Cone.quad_form_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the quadratic form atom — Dcp2Cone.quad_form_canon • CVXRDcp2Cone canonicalizer for the quadratic form atom — Dcp2Cone.quad_form_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the quadratic form atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a quadratic form atom, +

A cone program constructed from a quadratic form atom, where the objective function consists of the scaled objective function from the quadratic over linear canonicalization and same with the constraints.

@@ -101,15 +101,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.quad_over_lin_canon.html b/docs/reference/Dcp2Cone.quad_over_lin_canon.html index 84a6340a..80f31a15 100644 --- a/docs/reference/Dcp2Cone.quad_over_lin_canon.html +++ b/docs/reference/Dcp2Cone.quad_over_lin_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the quadratic over linear term atom — Dcp2Cone.quad_over_lin_canon • CVXRDcp2Cone canonicalizer for the quadratic over linear term atom — Dcp2Cone.quad_over_lin_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the quadratic over linear term atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a quadratic over linear +

A cone program constructed from a quadratic over linear term atom where the objective function consists of a one dimensional variable t with SOC constraints.

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dcp2Cone.sigma_max_canon.html b/docs/reference/Dcp2Cone.sigma_max_canon.html index 9a28979a..87175d24 100644 --- a/docs/reference/Dcp2Cone.sigma_max_canon.html +++ b/docs/reference/Dcp2Cone.sigma_max_canon.html @@ -1,9 +1,9 @@ -Dcp2Cone canonicalizer for the sigma max atom — Dcp2Cone.sigma_max_canon • CVXRDcp2Cone canonicalizer for the sigma max atom — Dcp2Cone.sigma_max_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dcp2Cone canonicalizer for the sigma max atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A cone program constructed from a sigma max atom +

A cone program constructed from a sigma max atom where the objective function consists of the variable t that is of the same dimension as the original expression with specified constraints in the function.

@@ -101,15 +101,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp-class.html b/docs/reference/Dgp2Dcp-class.html index 5220b426..7a4e1246 100644 --- a/docs/reference/Dgp2Dcp-class.html +++ b/docs/reference/Dgp2Dcp-class.html @@ -1,11 +1,11 @@ Reduce DGP problems to DCP problems. — Dgp2Dcp-class • CVXR - +
@@ -30,7 +30,7 @@
- +
@@ -70,48 +70,50 @@

Reduce DGP problems to DCP problems.

-
# S4 method for Dgp2Dcp,Problem
+    
# S4 method for class 'Dgp2Dcp,Problem'
 accepts(object, problem)
 
-# S4 method for Dgp2Dcp,Problem
+# S4 method for class 'Dgp2Dcp,Problem'
 perform(object, problem)
 
-# S4 method for Dgp2Dcp
+# S4 method for class 'Dgp2Dcp'
 canonicalize_expr(object, expr, args)
 
-# S4 method for Dgp2Dcp,Solution,InverseData
+# S4 method for class 'Dgp2Dcp,Solution,InverseData'
 invert(object, solution, inverse_data)

Arguments

-
object
+ + +
object

A Dgp2Dcp object.

-
problem
+
problem

A Problem object.

-
expr
+
expr

An Expression object corresponding to the DGP problem.

-
args
+
args

A list of values corresponding to the DGP expression

-
solution
+
solution

A Solution object to invert.

-
inverse_data
+
inverse_data

A InverseData object containing data necessary for the inversion.

Methods (by generic)

- +
  • accepts(object = Dgp2Dcp, problem = Problem): Is the problem DGP?

  • perform(object = Dgp2Dcp, problem = Problem): Converts the DGP problem to a DCP problem.

  • canonicalize_expr(Dgp2Dcp): Canonicalizes each atom within an Dgp2Dcp expression.

  • @@ -130,15 +132,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.add_canon.html b/docs/reference/Dgp2Dcp.add_canon.html index 5460e722..21134201 100644 --- a/docs/reference/Dgp2Dcp.add_canon.html +++ b/docs/reference/Dgp2Dcp.add_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the addition atom — Dgp2Dcp.add_canon • CVXRDgp2Dcp canonicalizer for the addition atom — Dgp2Dcp.add_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the addition atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the addition atom of a DGP expression, +

A canonicalization of the addition atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.constant_canon.html b/docs/reference/Dgp2Dcp.constant_canon.html index 77d59639..8683f237 100644 --- a/docs/reference/Dgp2Dcp.constant_canon.html +++ b/docs/reference/Dgp2Dcp.constant_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the constant atom — Dgp2Dcp.constant_canon • CVXRDgp2Dcp canonicalizer for the constant atom — Dgp2Dcp.constant_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the constant atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the constant atom of a DGP expression, +

A canonicalization of the constant atom of a DGP expression, where the returned expression is the DCP equivalent resulting from the log of the expression.

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.div_canon.html b/docs/reference/Dgp2Dcp.div_canon.html index 9fa9fa0d..b8b44724 100644 --- a/docs/reference/Dgp2Dcp.div_canon.html +++ b/docs/reference/Dgp2Dcp.div_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the division atom — Dgp2Dcp.div_canon • CVXRDgp2Dcp canonicalizer for the division atom — Dgp2Dcp.div_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the division atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the division atom of a DGP expression, +

A canonicalization of the division atom of a DGP expression, where the returned expression is the log transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.exp_canon.html b/docs/reference/Dgp2Dcp.exp_canon.html index 157c062f..aa0a757b 100644 --- a/docs/reference/Dgp2Dcp.exp_canon.html +++ b/docs/reference/Dgp2Dcp.exp_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the exp atom — Dgp2Dcp.exp_canon • CVXRDgp2Dcp canonicalizer for the exp atom — Dgp2Dcp.exp_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the exp atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the exp atom of a DGP expression, +

A canonicalization of the exp atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.eye_minus_inv_canon.html b/docs/reference/Dgp2Dcp.eye_minus_inv_canon.html index 6e9b1849..7bdc6a15 100644 --- a/docs/reference/Dgp2Dcp.eye_minus_inv_canon.html +++ b/docs/reference/Dgp2Dcp.eye_minus_inv_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the \((I - X)^{-1}\) atom — Dgp2Dcp.eye_minus_inv_canon • CVXRDgp2Dcp canonicalizer for the \((I - X)^{-1}\) atom — Dgp2Dcp.eye_minus_inv_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the \((I - X)^{-1}\) atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the \((I - X)^{-1}\) atom of a DGP expression, +

A canonicalization of the \((I - X)^{-1}\) atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.geo_mean_canon.html b/docs/reference/Dgp2Dcp.geo_mean_canon.html index 801538c9..64ee661c 100644 --- a/docs/reference/Dgp2Dcp.geo_mean_canon.html +++ b/docs/reference/Dgp2Dcp.geo_mean_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the geometric mean atom — Dgp2Dcp.geo_mean_canon • CVXRDgp2Dcp canonicalizer for the geometric mean atom — Dgp2Dcp.geo_mean_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the geometric mean atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the geometric mean atom of a DGP expression, +

A canonicalization of the geometric mean atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.html b/docs/reference/Dgp2Dcp.html new file mode 100644 index 00000000..97140cbd --- /dev/null +++ b/docs/reference/Dgp2Dcp.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Dgp2Dcp.log_canon.html b/docs/reference/Dgp2Dcp.log_canon.html index 704b06e1..24e5ed2f 100644 --- a/docs/reference/Dgp2Dcp.log_canon.html +++ b/docs/reference/Dgp2Dcp.log_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the log atom — Dgp2Dcp.log_canon • CVXRDgp2Dcp canonicalizer for the log atom — Dgp2Dcp.log_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the log atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the log atom of a DGP expression, +

A canonicalization of the log atom of a DGP expression, where the returned expression is the log of the original expression..

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.mul_canon.html b/docs/reference/Dgp2Dcp.mul_canon.html index d275c587..5bae16c3 100644 --- a/docs/reference/Dgp2Dcp.mul_canon.html +++ b/docs/reference/Dgp2Dcp.mul_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the multiplication atom — Dgp2Dcp.mul_canon • CVXRDgp2Dcp canonicalizer for the multiplication atom — Dgp2Dcp.mul_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the multiplication atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the multiplication atom of a DGP expression, +

A canonicalization of the multiplication atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.mulexpression_canon.html b/docs/reference/Dgp2Dcp.mulexpression_canon.html index 2f91aa81..7f77a5db 100644 --- a/docs/reference/Dgp2Dcp.mulexpression_canon.html +++ b/docs/reference/Dgp2Dcp.mulexpression_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the multiplication expression atom — Dgp2Dcp.mulexpression_canon • CVXRDgp2Dcp canonicalizer for the multiplication expression atom — Dgp2Dcp.mulexpression_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the multiplication expression atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the multiplication expression atom +

A canonicalization of the multiplication expression atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.nonpos_constr_canon.html b/docs/reference/Dgp2Dcp.nonpos_constr_canon.html index e5be8fbe..4b4f9a92 100644 --- a/docs/reference/Dgp2Dcp.nonpos_constr_canon.html +++ b/docs/reference/Dgp2Dcp.nonpos_constr_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the non-positive constraint atom — Dgp2Dcp.nonpos_constr_canon • CVXRDgp2Dcp canonicalizer for the non-positive constraint atom — Dgp2Dcp.nonpos_constr_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the non-positive constraint atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the non-positive contraint atom of a DGP expression, +

A canonicalization of the non-positive contraint atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.norm1_canon.html b/docs/reference/Dgp2Dcp.norm1_canon.html index f3aedf44..800608f3 100644 --- a/docs/reference/Dgp2Dcp.norm1_canon.html +++ b/docs/reference/Dgp2Dcp.norm1_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the 1 norm atom — Dgp2Dcp.norm1_canon • CVXRDgp2Dcp canonicalizer for the 1 norm atom — Dgp2Dcp.norm1_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the 1 norm atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the norm1 atom of a DGP expression, +

A canonicalization of the norm1 atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.norm_inf_canon.html b/docs/reference/Dgp2Dcp.norm_inf_canon.html index 5dffcc33..a4571f31 100644 --- a/docs/reference/Dgp2Dcp.norm_inf_canon.html +++ b/docs/reference/Dgp2Dcp.norm_inf_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the infinite norm atom — Dgp2Dcp.norm_inf_canon • CVXRDgp2Dcp canonicalizer for the infinite norm atom — Dgp2Dcp.norm_inf_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the infinite norm atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the infinity norm atom of a DGP expression, +

A canonicalization of the infinity norm atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.one_minus_pos_canon.html b/docs/reference/Dgp2Dcp.one_minus_pos_canon.html index 2d668c8a..58eaa56b 100644 --- a/docs/reference/Dgp2Dcp.one_minus_pos_canon.html +++ b/docs/reference/Dgp2Dcp.one_minus_pos_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the 1-x atom — Dgp2Dcp.one_minus_pos_canon • CVXRDgp2Dcp canonicalizer for the 1-x atom — Dgp2Dcp.one_minus_pos_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the 1-x atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the 1-x with 0 < x < 1 atom of a DGP expression, +

A canonicalization of the 1-x with 0 < x < 1 atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.parameter_canon.html b/docs/reference/Dgp2Dcp.parameter_canon.html index 37f5ca6f..59cb9cf7 100644 --- a/docs/reference/Dgp2Dcp.parameter_canon.html +++ b/docs/reference/Dgp2Dcp.parameter_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the parameter atom — Dgp2Dcp.parameter_canon • CVXRDgp2Dcp canonicalizer for the parameter atom — Dgp2Dcp.parameter_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the parameter atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the parameter atom of a DGP expression, +

A canonicalization of the parameter atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.pf_eigenvalue_canon.html b/docs/reference/Dgp2Dcp.pf_eigenvalue_canon.html index 8681d9b5..8b9ac216 100644 --- a/docs/reference/Dgp2Dcp.pf_eigenvalue_canon.html +++ b/docs/reference/Dgp2Dcp.pf_eigenvalue_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the spectral radius atom — Dgp2Dcp.pf_eigenvalue_canon • CVXRDgp2Dcp canonicalizer for the spectral radius atom — Dgp2Dcp.pf_eigenvalue_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the spectral radius atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the spectral radius atom of a DGP expression, +

A canonicalization of the spectral radius atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.pnorm_canon.html b/docs/reference/Dgp2Dcp.pnorm_canon.html index 3fd2d8ac..e9ec0c85 100644 --- a/docs/reference/Dgp2Dcp.pnorm_canon.html +++ b/docs/reference/Dgp2Dcp.pnorm_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the p norm atom — Dgp2Dcp.pnorm_canon • CVXRDgp2Dcp canonicalizer for the p norm atom — Dgp2Dcp.pnorm_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the p norm atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the pnorm atom of a DGP expression, +

A canonicalization of the pnorm atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.power_canon.html b/docs/reference/Dgp2Dcp.power_canon.html index f86dfe8d..a7d03f86 100644 --- a/docs/reference/Dgp2Dcp.power_canon.html +++ b/docs/reference/Dgp2Dcp.power_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the power atom — Dgp2Dcp.power_canon • CVXRDgp2Dcp canonicalizer for the power atom — Dgp2Dcp.power_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the power atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the power atom of a DGP expression, +

A canonicalization of the power atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.prod_canon.html b/docs/reference/Dgp2Dcp.prod_canon.html index d31bcef5..4b4b34b2 100644 --- a/docs/reference/Dgp2Dcp.prod_canon.html +++ b/docs/reference/Dgp2Dcp.prod_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the product atom — Dgp2Dcp.prod_canon • CVXRDgp2Dcp canonicalizer for the product atom — Dgp2Dcp.prod_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the product atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the product atom of a DGP expression, +

A canonicalization of the product atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.quad_form_canon.html b/docs/reference/Dgp2Dcp.quad_form_canon.html index ec87938a..6d9715c2 100644 --- a/docs/reference/Dgp2Dcp.quad_form_canon.html +++ b/docs/reference/Dgp2Dcp.quad_form_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the quadratic form atom — Dgp2Dcp.quad_form_canon • CVXRDgp2Dcp canonicalizer for the quadratic form atom — Dgp2Dcp.quad_form_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the quadratic form atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the quadratic form atom of a DGP expression, +

A canonicalization of the quadratic form atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.quad_over_lin_canon.html b/docs/reference/Dgp2Dcp.quad_over_lin_canon.html index 2dae99b6..255280b3 100644 --- a/docs/reference/Dgp2Dcp.quad_over_lin_canon.html +++ b/docs/reference/Dgp2Dcp.quad_over_lin_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the quadratic over linear term atom — Dgp2Dcp.quad_over_lin_canon • CVXRDgp2Dcp canonicalizer for the quadratic over linear term atom — Dgp2Dcp.quad_over_lin_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the quadratic over linear term atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the quadratic over linear atom of a +

A canonicalization of the quadratic over linear atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.sum_canon.html b/docs/reference/Dgp2Dcp.sum_canon.html index 0877b999..be304777 100644 --- a/docs/reference/Dgp2Dcp.sum_canon.html +++ b/docs/reference/Dgp2Dcp.sum_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the sum atom — Dgp2Dcp.sum_canon • CVXRDgp2Dcp canonicalizer for the sum atom — Dgp2Dcp.sum_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the sum atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the sum atom of a DGP expression, +

A canonicalization of the sum atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.trace_canon.html b/docs/reference/Dgp2Dcp.trace_canon.html index 10200abd..894f88e9 100644 --- a/docs/reference/Dgp2Dcp.trace_canon.html +++ b/docs/reference/Dgp2Dcp.trace_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the trace atom — Dgp2Dcp.trace_canon • CVXRDgp2Dcp canonicalizer for the trace atom — Dgp2Dcp.trace_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the trace atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the trace atom of a DGP expression, +

A canonicalization of the trace atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Dgp2Dcp.zero_constr_canon.html b/docs/reference/Dgp2Dcp.zero_constr_canon.html index f71d76e1..1d719e73 100644 --- a/docs/reference/Dgp2Dcp.zero_constr_canon.html +++ b/docs/reference/Dgp2Dcp.zero_constr_canon.html @@ -1,9 +1,9 @@ -Dgp2Dcp canonicalizer for the zero constraint atom — Dgp2Dcp.zero_constr_canon • CVXRDgp2Dcp canonicalizer for the zero constraint atom — Dgp2Dcp.zero_constr_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Dgp2Dcp canonicalizer for the zero constraint atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of values for the expr variable

Value

- - -

A canonicalization of the zero constraint atom of a DGP expression, +

A canonicalization of the zero constraint atom of a DGP expression, where the returned expression is the transformed DCP equivalent.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/DgpCanonMethods-class.html b/docs/reference/DgpCanonMethods-class.html index 35541363..c70499af 100644 --- a/docs/reference/DgpCanonMethods-class.html +++ b/docs/reference/DgpCanonMethods-class.html @@ -1,9 +1,9 @@ -DGP canonical methods class. — DgpCanonMethods-class • CVXRDGP canonical methods class. — DgpCanonMethods-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,26 +66,28 @@

DGP canonical methods class.

-
# S4 method for DgpCanonMethods
-names(x)
-
-# S4 method for DgpCanonMethods
-$(x, name)
+
# S4 method for class 'DgpCanonMethods'
+names(x)
+
+# S4 method for class 'DgpCanonMethods'
+x$name

Arguments

-
x
+ + +
x

A DgpCanonMethods object.

-
name
+
name

The name of the atom or expression to canonicalize.

Methods (by generic)

- +
  • names(DgpCanonMethods): Returns the name of all the canonicalization methods

  • $: Returns either a canonicalized variable or a corresponding Dgp2Dcp canonicalization method

  • @@ -103,15 +105,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Diag-int.html b/docs/reference/Diag-int.html index 4d95cd62..965a65b7 100644 --- a/docs/reference/Diag-int.html +++ b/docs/reference/Diag-int.html @@ -1,9 +1,9 @@ -Turns an expression into a DiagVec object — Diag • CVXRTurns an expression into a DiagVec object — Diag • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Turns an expression into a DiagVec object

Arguments

-
expr
+ + +
expr

An Expression that represents a vector or square matrix.

Value

- - -

An Expression representing the diagonal vector/matrix.

+

An Expression representing the diagonal vector/matrix.

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/DiagMat-class.html b/docs/reference/DiagMat-class.html index be32559b..5fa82974 100644 --- a/docs/reference/DiagMat-class.html +++ b/docs/reference/DiagMat-class.html @@ -1,9 +1,9 @@ -The DiagMat class. — DiagMat-class • CVXRThe DiagMat class. — DiagMat-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,51 +68,53 @@

The DiagMat class.

DiagMat(expr)
 
-# S4 method for DiagMat
+# S4 method for class 'DiagMat'
 to_numeric(object, values)
 
-# S4 method for DiagMat
+# S4 method for class 'DiagMat'
 dim_from_args(object)
 
-# S4 method for DiagMat
+# S4 method for class 'DiagMat'
 is_atom_log_log_convex(object)
 
-# S4 method for DiagMat
+# S4 method for class 'DiagMat'
 is_atom_log_log_concave(object)
 
-# S4 method for DiagMat
+# S4 method for class 'DiagMat'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
expr
+ + +
expr

An Expression representing the matrix whose diagonal we are interested in.

-
object
+
object

A DiagMat object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(DiagMat): Extract the diagonal from a square matrix constant.

  • dim_from_args(DiagMat): The size of the atom.

  • is_atom_log_log_convex(DiagMat): Is the atom log-log convex?

  • @@ -121,7 +123,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression representing the matrix whose diagonal we are interested in.

@@ -141,15 +143,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/DiagMat.html b/docs/reference/DiagMat.html new file mode 100644 index 00000000..c7ee6a1c --- /dev/null +++ b/docs/reference/DiagMat.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/DiagVec-class.html b/docs/reference/DiagVec-class.html index 1e6e6354..62fefb8b 100644 --- a/docs/reference/DiagVec-class.html +++ b/docs/reference/DiagVec-class.html @@ -1,9 +1,9 @@ -The DiagVec class. — DiagVec-class • CVXRThe DiagVec class. — DiagVec-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,57 +68,59 @@

The DiagVec class.

DiagVec(expr)
 
-# S4 method for DiagVec
+# S4 method for class 'DiagVec'
 to_numeric(object, values)
 
-# S4 method for DiagVec
+# S4 method for class 'DiagVec'
 dim_from_args(object)
 
-# S4 method for DiagVec
+# S4 method for class 'DiagVec'
 is_atom_log_log_convex(object)
 
-# S4 method for DiagVec
+# S4 method for class 'DiagVec'
 is_atom_log_log_concave(object)
 
-# S4 method for DiagVec
+# S4 method for class 'DiagVec'
 is_symmetric(object)
 
-# S4 method for DiagVec
+# S4 method for class 'DiagVec'
 is_hermitian(object)
 
-# S4 method for DiagVec
+# S4 method for class 'DiagVec'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
expr
+ + +
expr

An Expression representing the vector to convert.

-
object
+
object

A DiagVec object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(DiagVec): Convert the vector constant into a diagonal matrix.

  • dim_from_args(DiagVec): The dimensions of the atom.

  • is_atom_log_log_convex(DiagVec): Is the atom log-log convex?

  • @@ -129,7 +131,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression representing the vector to convert.

@@ -149,15 +151,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/DiagVec.html b/docs/reference/DiagVec.html new file mode 100644 index 00000000..13c5eb42 --- /dev/null +++ b/docs/reference/DiagVec.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Diff-int.html b/docs/reference/Diff-int.html index 11fab539..1a5c08db 100644 --- a/docs/reference/Diff-int.html +++ b/docs/reference/Diff-int.html @@ -1,9 +1,9 @@ -Takes the k-th order differences — Diff • CVXRTakes the k-th order differences — Diff • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Takes the k-th order differences

Arguments

-
x
+ + +
x

An Expression that represents a vector

-
lag
+
lag

The degree of lag between differences

-
k
+
k

The integer value of the order of differences

-
axis
+
axis

The axis along which to apply the function. For a 2D matrix, 1 indicates rows and 2 indicates columns.

Value

- - -

Takes in a vector of length n and returns a vector of length n-k of the kth order differences

+

Takes in a vector of length n and returns a vector of length n-k of the kth order differences

@@ -106,15 +106,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/DiffPos.html b/docs/reference/DiffPos.html index bf736add..8bbb5dd1 100644 --- a/docs/reference/DiffPos.html +++ b/docs/reference/DiffPos.html @@ -1,9 +1,9 @@ -The DiffPos atom. — DiffPos • CVXRThe DiffPos atom. — DiffPos • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

The DiffPos atom.

Arguments

-
x
+ + +
x

An Expression

-
y
+
y

An Expression

Value

- - -

The difference \(x - y\) with domain \(x,y: x > y > 0\).

+

The difference \(x - y\) with domain \(x,y: x > y > 0\).

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/DivExpression-class.html b/docs/reference/DivExpression-class.html index 0cd2cf53..fef71dab 100644 --- a/docs/reference/DivExpression-class.html +++ b/docs/reference/DivExpression-class.html @@ -1,9 +1,9 @@ -The DivExpression class. — /,Expression,Expression-method • CVXRThe DivExpression class. — /,Expression,Expression-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,82 +66,84 @@

The DivExpression class.

-
# S4 method for Expression,Expression
-/(e1, e2)
-
-# S4 method for Expression,ConstVal
-/(e1, e2)
-
-# S4 method for ConstVal,Expression
-/(e1, e2)
-
-# S4 method for DivExpression
-to_numeric(object, values)
-
-# S4 method for DivExpression
-is_quadratic(object)
-
-# S4 method for DivExpression
-is_qpwa(object)
-
-# S4 method for DivExpression
-dim_from_args(object)
-
-# S4 method for DivExpression
-is_atom_convex(object)
-
-# S4 method for DivExpression
-is_atom_concave(object)
-
-# S4 method for DivExpression
-is_atom_log_log_convex(object)
-
-# S4 method for DivExpression
-is_atom_log_log_concave(object)
-
-# S4 method for DivExpression
-is_incr(object, idx)
-
-# S4 method for DivExpression
-is_decr(object, idx)
-
-# S4 method for DivExpression
-graph_implementation(object, arg_objs, dim, data = NA_real_)
+
# S4 method for class 'Expression,Expression'
+e1/e2
+
+# S4 method for class 'Expression,ConstVal'
+e1/e2
+
+# S4 method for class 'ConstVal,Expression'
+e1/e2
+
+# S4 method for class 'DivExpression'
+to_numeric(object, values)
+
+# S4 method for class 'DivExpression'
+is_quadratic(object)
+
+# S4 method for class 'DivExpression'
+is_qpwa(object)
+
+# S4 method for class 'DivExpression'
+dim_from_args(object)
+
+# S4 method for class 'DivExpression'
+is_atom_convex(object)
+
+# S4 method for class 'DivExpression'
+is_atom_concave(object)
+
+# S4 method for class 'DivExpression'
+is_atom_log_log_convex(object)
+
+# S4 method for class 'DivExpression'
+is_atom_log_log_concave(object)
+
+# S4 method for class 'DivExpression'
+is_incr(object, idx)
+
+# S4 method for class 'DivExpression'
+is_decr(object, idx)
+
+# S4 method for class 'DivExpression'
+graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
e1, e2
+ + +
e1, e2

The Expression objects or numeric constants to divide. The denominator, e2, must be a scalar constant.

-
object
+
object

A DivExpression object.

-
values
+
values

A list of arguments to the atom.

-
idx
+
idx

An index into the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(DivExpression): Matrix division by a scalar.

  • is_quadratic(DivExpression): Is the left-hand expression quadratic and the right-hand expression constant?

  • is_qpwa(DivExpression): Is the expression quadratic of piecewise affine?

  • @@ -167,15 +169,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/DivExpression.html b/docs/reference/DivExpression.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/DivExpression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/ECOS-class.html b/docs/reference/ECOS-class.html index 06f6715e..aa2d4e8b 100644 --- a/docs/reference/ECOS-class.html +++ b/docs/reference/ECOS-class.html @@ -1,9 +1,9 @@ -An interface for the ECOS solver — ECOS-class • CVXRAn interface for the ECOS solver — ECOS-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,50 +68,52 @@

An interface for the ECOS solver

ECOS()
 
-# S4 method for ECOS
+# S4 method for class 'ECOS'
 mip_capable(solver)
 
-# S4 method for ECOS
+# S4 method for class 'ECOS'
 status_map(solver, status)
 
-# S4 method for ECOS
+# S4 method for class 'ECOS'
 import_solver(solver)
 
-# S4 method for ECOS
+# S4 method for class 'ECOS'
 name(x)
 
-# S4 method for ECOS,Problem
+# S4 method for class 'ECOS,Problem'
 perform(object, problem)
 
-# S4 method for ECOS,list,list
+# S4 method for class 'ECOS,list,list'
 invert(object, solution, inverse_data)

Arguments

-
solver, object, x
+ + +
solver, object, x

A ECOS object.

-
status
+
status

A status code returned by the solver.

-
problem
+
problem

A Problem object.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A list containing data necessary for the inversion.

Methods (by generic)

- +
  • mip_capable(ECOS): Can the solver handle mixed-integer programs?

  • status_map(ECOS): Converts status returned by the ECOS solver to its respective CVXPY status.

  • import_solver(ECOS): Imports the solver

  • @@ -132,15 +134,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ECOS.dims_to_solver_dict.html b/docs/reference/ECOS.dims_to_solver_dict.html index c5a3a743..0a70cd10 100644 --- a/docs/reference/ECOS.dims_to_solver_dict.html +++ b/docs/reference/ECOS.dims_to_solver_dict.html @@ -1,10 +1,10 @@ Utility method for formatting a ConeDims instance into a dictionary that can be supplied to ECOS. — ECOS.dims_to_solver_dict • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -73,15 +73,15 @@

Utility method for formatting a ConeDims instance into a dictionary that can

Arguments

-
cone_dims
+ + +
cone_dims

A ConeDims instance.

Value

- - -

A dictionary of cone dimensions

+

A dictionary of cone dimensions

@@ -96,15 +96,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ECOS.html b/docs/reference/ECOS.html new file mode 100644 index 00000000..35ec5a21 --- /dev/null +++ b/docs/reference/ECOS.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/ECOS_BB-class.html b/docs/reference/ECOS_BB-class.html index ee91f904..906c872f 100644 --- a/docs/reference/ECOS_BB-class.html +++ b/docs/reference/ECOS_BB-class.html @@ -1,9 +1,9 @@ -An interface for the ECOS BB solver. — ECOS_BB-class • CVXRAn interface for the ECOS BB solver. — ECOS_BB-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,16 +68,16 @@

An interface for the ECOS BB solver.

ECOS_BB()
 
-# S4 method for ECOS_BB
+# S4 method for class 'ECOS_BB'
 mip_capable(solver)
 
-# S4 method for ECOS_BB
+# S4 method for class 'ECOS_BB'
 name(x)
 
-# S4 method for ECOS_BB,Problem
+# S4 method for class 'ECOS_BB,Problem'
 perform(object, problem)
 
-# S4 method for ECOS_BB
+# S4 method for class 'ECOS_BB'
 solve_via_data(
   object,
   data,
@@ -94,53 +94,55 @@ 

An interface for the ECOS BB solver.

Arguments

-
solver, object, x
+ + +
solver, object, x

A ECOS_BB object.

-
problem
+
problem

A Problem object.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance.

-
reltol
+
reltol

The relative tolerance.

-
abstol
+
abstol

The absolute tolerance.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(ECOS_BB): Can the solver handle mixed-integer programs?

  • name(ECOS_BB): Returns the name of the solver.

  • perform(object = ECOS_BB, problem = Problem): Returns a new problem and data for inverting the new solution.

  • @@ -159,15 +161,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ECOS_BB.html b/docs/reference/ECOS_BB.html new file mode 100644 index 00000000..55db89f5 --- /dev/null +++ b/docs/reference/ECOS_BB.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Elementwise-class.html b/docs/reference/Elementwise-class.html index cbfdfc20..4655b139 100644 --- a/docs/reference/Elementwise-class.html +++ b/docs/reference/Elementwise-class.html @@ -1,9 +1,9 @@ -The Elementwise class. — Elementwise-class • CVXRThe Elementwise class. — Elementwise-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,25 +66,27 @@

The Elementwise class.

-
# S4 method for Elementwise
+    
# S4 method for class 'Elementwise'
 dim_from_args(object)
 
-# S4 method for Elementwise
+# S4 method for class 'Elementwise'
 validate_args(object)
 
-# S4 method for Elementwise
+# S4 method for class 'Elementwise'
 is_symmetric(object)

Arguments

-
object
+ + +
object

An Elementwise object.

Methods (by generic)

- +
  • dim_from_args(Elementwise): Dimensions is the same as the sum of the arguments' dimensions.

  • validate_args(Elementwise): Verify that all the dimensions are the same or can be promoted.

  • is_symmetric(Elementwise): Is the expression symmetric?

  • @@ -102,15 +104,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Elementwise.html b/docs/reference/Elementwise.html new file mode 100644 index 00000000..aff69519 --- /dev/null +++ b/docs/reference/Elementwise.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/EliminatePwl-class.html b/docs/reference/EliminatePwl-class.html index 9628756e..200987df 100644 --- a/docs/reference/EliminatePwl-class.html +++ b/docs/reference/EliminatePwl-class.html @@ -1,9 +1,9 @@ -The EliminatePwl class. — EliminatePwl-class • CVXRThe EliminatePwl class. — EliminatePwl-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,23 +66,25 @@

The EliminatePwl class.

-
# S4 method for EliminatePwl,Problem
+    
# S4 method for class 'EliminatePwl,Problem'
 accepts(object, problem)

Arguments

-
object
+ + +
object

An EliminatePwl object.

-
problem
+
problem

A Problem object.

Methods (by generic)

- +
  • accepts(object = EliminatePwl, problem = Problem): Does this problem contain piecewise linear atoms?

@@ -98,15 +100,15 @@

Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EliminatePwl.abs_canon.html b/docs/reference/EliminatePwl.abs_canon.html index 4379ca44..9a873e35 100644 --- a/docs/reference/EliminatePwl.abs_canon.html +++ b/docs/reference/EliminatePwl.abs_canon.html @@ -1,9 +1,9 @@ -EliminatePwl canonicalizer for the absolute atom — EliminatePwl.abs_canon • CVXREliminatePwl canonicalizer for the absolute atom — EliminatePwl.abs_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,22 +71,22 @@

EliminatePwl canonicalizer for the absolute atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A canonicalization of the picewise-lienar atom -constructed from an absolute atom where the objective function -consists of the variable that is of the same dimension as the -original expression and the constraints consist of splitting +

A canonicalization of the picewise-lienar atom +constructed from an absolute atom where the objective function +consists of the variable that is of the same dimension as the +original expression and the constraints consist of splitting the absolute value into two inequalities.

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EliminatePwl.cummax_canon.html b/docs/reference/EliminatePwl.cummax_canon.html index 4f180092..c8f7da1f 100644 --- a/docs/reference/EliminatePwl.cummax_canon.html +++ b/docs/reference/EliminatePwl.cummax_canon.html @@ -1,9 +1,9 @@ -EliminatePwl canonicalizer for the cumulative max atom — EliminatePwl.cummax_canon • CVXREliminatePwl canonicalizer for the cumulative max atom — EliminatePwl.cummax_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

EliminatePwl canonicalizer for the cumulative max atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A canonicalization of the piecewise-lienar atom +

A canonicalization of the piecewise-lienar atom constructed from a cumulative max atom where the objective function consists of the variable Y which is of the same dimension as the original expression and the constraints @@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EliminatePwl.cumsum_canon.html b/docs/reference/EliminatePwl.cumsum_canon.html index 5dfd564e..afbebee4 100644 --- a/docs/reference/EliminatePwl.cumsum_canon.html +++ b/docs/reference/EliminatePwl.cumsum_canon.html @@ -1,9 +1,9 @@ -EliminatePwl canonicalizer for the cumulative sum atom — EliminatePwl.cumsum_canon • CVXREliminatePwl canonicalizer for the cumulative sum atom — EliminatePwl.cumsum_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

EliminatePwl canonicalizer for the cumulative sum atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A canonicalization of the piecewise-lienar atom +

A canonicalization of the piecewise-lienar atom constructed from a cumulative sum atom where the objective is Y that is of the same dimension as the matrix of the expression and the constraints consist of various row constraints

@@ -101,15 +101,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EliminatePwl.max_elemwise_canon.html b/docs/reference/EliminatePwl.max_elemwise_canon.html index 58d76a13..207c525e 100644 --- a/docs/reference/EliminatePwl.max_elemwise_canon.html +++ b/docs/reference/EliminatePwl.max_elemwise_canon.html @@ -1,9 +1,9 @@ -EliminatePwl canonicalizer for the elementwise maximum atom — EliminatePwl.max_elemwise_canon • CVXREliminatePwl canonicalizer for the elementwise maximum atom — EliminatePwl.max_elemwise_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

EliminatePwl canonicalizer for the elementwise maximum atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A canonicalization of the piecewise-lienar atom +

A canonicalization of the piecewise-lienar atom constructed by a elementwise maximum atom where the objective function is the variable t of the same dimension as the expression and the constraints consist of a simple @@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EliminatePwl.max_entries_canon.html b/docs/reference/EliminatePwl.max_entries_canon.html index 3a9f12ab..ed869e27 100644 --- a/docs/reference/EliminatePwl.max_entries_canon.html +++ b/docs/reference/EliminatePwl.max_entries_canon.html @@ -1,9 +1,9 @@ -EliminatePwl canonicalizer for the max entries atom — EliminatePwl.max_entries_canon • CVXREliminatePwl canonicalizer for the max entries atom — EliminatePwl.max_entries_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

EliminatePwl canonicalizer for the max entries atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A canonicalization of the piecewise-lienar atom +

A canonicalization of the piecewise-lienar atom constructed from the max entries atom where the objective function consists of the variable t of the same size as the original expression and the constraints consist of @@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EliminatePwl.min_elemwise_canon.html b/docs/reference/EliminatePwl.min_elemwise_canon.html index bb2a7dbd..c0ade083 100644 --- a/docs/reference/EliminatePwl.min_elemwise_canon.html +++ b/docs/reference/EliminatePwl.min_elemwise_canon.html @@ -1,9 +1,9 @@ -EliminatePwl canonicalizer for the elementwise minimum atom — EliminatePwl.min_elemwise_canon • CVXREliminatePwl canonicalizer for the elementwise minimum atom — EliminatePwl.min_elemwise_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

EliminatePwl canonicalizer for the elementwise minimum atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A canonicalization of the piecewise-lienar atom +

A canonicalization of the piecewise-lienar atom constructed by a minimum elementwise atom where the objective function is the negative of variable t t produced by max_elemwise_canon of the same dimension @@ -103,15 +103,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EliminatePwl.min_entries_canon.html b/docs/reference/EliminatePwl.min_entries_canon.html index c2d3d51c..30d0eec6 100644 --- a/docs/reference/EliminatePwl.min_entries_canon.html +++ b/docs/reference/EliminatePwl.min_entries_canon.html @@ -1,9 +1,9 @@ -EliminatePwl canonicalizer for the minimum entries atom — EliminatePwl.min_entries_canon • CVXREliminatePwl canonicalizer for the minimum entries atom — EliminatePwl.min_entries_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,21 +71,21 @@

EliminatePwl canonicalizer for the minimum entries atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A canonicalization of the piecewise-lienar atom +

A canonicalization of the piecewise-lienar atom constructed by a minimum entries atom where the -objective function is the negative of variable +objective function is the negative of variable t produced by max_elemwise_canon of the same dimension as the expression and the constraints consist of a simple inequality.

@@ -103,15 +103,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EliminatePwl.norm1_canon.html b/docs/reference/EliminatePwl.norm1_canon.html index 8d4b23ea..1bd620b1 100644 --- a/docs/reference/EliminatePwl.norm1_canon.html +++ b/docs/reference/EliminatePwl.norm1_canon.html @@ -1,9 +1,9 @@ -EliminatePwl canonicalizer for the 1 norm atom — EliminatePwl.norm1_canon • CVXREliminatePwl canonicalizer for the 1 norm atom — EliminatePwl.norm1_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

EliminatePwl canonicalizer for the 1 norm atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A canonicalization of the piecewise-lienar atom +

A canonicalization of the piecewise-lienar atom constructed by the norm1 atom where the objective functino consists of the sum of the variables created by the abs_canon function and the constraints consist of @@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EliminatePwl.norm_inf_canon.html b/docs/reference/EliminatePwl.norm_inf_canon.html index c6d7f7e8..636eb92e 100644 --- a/docs/reference/EliminatePwl.norm_inf_canon.html +++ b/docs/reference/EliminatePwl.norm_inf_canon.html @@ -1,9 +1,9 @@ -EliminatePwl canonicalizer for the infinite norm atom — EliminatePwl.norm_inf_canon • CVXREliminatePwl canonicalizer for the infinite norm atom — EliminatePwl.norm_inf_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

EliminatePwl canonicalizer for the infinite norm atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A canonicalization of the piecewise-lienar atom +

A canonicalization of the piecewise-lienar atom constructed by the infinite norm atom where the objective function consists variable t of the same dimension as the expression and the constraints consist of a vector @@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EliminatePwl.sum_largest_canon.html b/docs/reference/EliminatePwl.sum_largest_canon.html index 2a7530b0..297fbdb9 100644 --- a/docs/reference/EliminatePwl.sum_largest_canon.html +++ b/docs/reference/EliminatePwl.sum_largest_canon.html @@ -1,9 +1,9 @@ -EliminatePwl canonicalizer for the largest sum atom — EliminatePwl.sum_largest_canon • CVXREliminatePwl canonicalizer for the largest sum atom — EliminatePwl.sum_largest_canon • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

EliminatePwl canonicalizer for the largest sum atom

Arguments

-
expr
+ + +
expr

An Expression object

-
args
+
args

A list of Constraint objects

Value

- - -

A canonicalization of the piecewise-lienar atom +

A canonicalization of the piecewise-lienar atom constructed by the k largest sums atom where the objective function consists of the sum of variables t that is of the same dimension as the expression plus k

@@ -101,15 +101,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Entr-class.html b/docs/reference/Entr-class.html index dd41e765..0f347716 100644 --- a/docs/reference/Entr-class.html +++ b/docs/reference/Entr-class.html @@ -1,9 +1,9 @@ -The Entr class. — Entr-class • CVXRThe Entr class. — Entr-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,52 +68,54 @@

The Entr class.

Entr(x)
 
-# S4 method for Entr
+# S4 method for class 'Entr'
 to_numeric(object, values)
 
-# S4 method for Entr
+# S4 method for class 'Entr'
 sign_from_args(object)
 
-# S4 method for Entr
+# S4 method for class 'Entr'
 is_atom_convex(object)
 
-# S4 method for Entr
+# S4 method for class 'Entr'
 is_atom_concave(object)
 
-# S4 method for Entr
+# S4 method for class 'Entr'
 is_incr(object, idx)
 
-# S4 method for Entr
+# S4 method for class 'Entr'
 is_decr(object, idx)
 
-# S4 method for Entr
+# S4 method for class 'Entr'
 .grad(object, values)
 
-# S4 method for Entr
+# S4 method for class 'Entr'
 .domain(object)

Arguments

-
x
+ + +
x

An Expression or numeric constant.

-
object
+
object

An Entr object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(Entr): The elementwise entropy function evaluated at the value.

  • sign_from_args(Entr): The sign of the atom is unknown.

  • is_atom_convex(Entr): The atom is not convex.

  • @@ -125,7 +127,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric constant.

@@ -145,15 +147,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EqConstraint-class.html b/docs/reference/EqConstraint-class.html index e8de3025..58a679d1 100644 --- a/docs/reference/EqConstraint-class.html +++ b/docs/reference/EqConstraint-class.html @@ -1,9 +1,9 @@ -The EqConstraint class — ==,Expression,Expression-method • CVXRThe EqConstraint class — ==,Expression,Expression-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,50 +66,52 @@

The EqConstraint class

-
# S4 method for Expression,Expression
-==(e1, e2)
-
-# S4 method for Expression,ConstVal
-==(e1, e2)
-
-# S4 method for ConstVal,Expression
-==(e1, e2)
-
-# S4 method for EqConstraint
-name(x)
-
-# S4 method for EqConstraint
-dim(x)
-
-# S4 method for EqConstraint
-size(object)
-
-# S4 method for EqConstraint
-expr(object)
-
-# S4 method for EqConstraint
-is_dcp(object)
-
-# S4 method for EqConstraint
-is_dgp(object)
-
-# S4 method for EqConstraint
-residual(object)
+
# S4 method for class 'Expression,Expression'
+e1 == e2
+
+# S4 method for class 'Expression,ConstVal'
+e1 == e2
+
+# S4 method for class 'ConstVal,Expression'
+e1 == e2
+
+# S4 method for class 'EqConstraint'
+name(x)
+
+# S4 method for class 'EqConstraint'
+dim(x)
+
+# S4 method for class 'EqConstraint'
+size(object)
+
+# S4 method for class 'EqConstraint'
+expr(object)
+
+# S4 method for class 'EqConstraint'
+is_dcp(object)
+
+# S4 method for class 'EqConstraint'
+is_dgp(object)
+
+# S4 method for class 'EqConstraint'
+residual(object)

Arguments

-
e1, e2
+ + +
e1, e2

The Expression objects or numeric constants to compare.

-
x, object
+
x, object

A EqConstraint object.

Methods (by generic)

- +
  • name(EqConstraint): The string representation of the constraint.

  • dim(EqConstraint): The dimensions of the constrained expression.

  • size(EqConstraint): The size of the constrained expression.

  • @@ -131,15 +133,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EvalParams-class.html b/docs/reference/EvalParams-class.html index cd8f02cd..32e37eda 100644 --- a/docs/reference/EvalParams-class.html +++ b/docs/reference/EvalParams-class.html @@ -1,10 +1,10 @@ The EvalParams class. — EvalParams-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -68,34 +68,36 @@

The EvalParams class.

-
# S4 method for EvalParams,Problem
+    
# S4 method for class 'EvalParams,Problem'
 perform(object, problem)
 
-# S4 method for EvalParams,Solution,list
+# S4 method for class 'EvalParams,Solution,list'
 invert(object, solution, inverse_data)

Arguments

-
object
+ + +
object

A EvalParams object.

-
problem
+
problem

A Problem object.

-
solution
+
solution

A Solution to a problem that generated the inverse data.

-
inverse_data
+
inverse_data

The inverse data returned by an invocation to apply.

Methods (by generic)

- +
  • perform(object = EvalParams, problem = Problem): Replace parameters with constant values.

  • invert(object = EvalParams, solution = Solution, inverse_data = list): Returns a solution to the original problem given the inverse_data.

@@ -112,15 +114,15 @@

Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EvalParams.html b/docs/reference/EvalParams.html new file mode 100644 index 00000000..2b6d9ea4 --- /dev/null +++ b/docs/reference/EvalParams.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Exp-class.html b/docs/reference/Exp-class.html index f64a9925..79dd9214 100644 --- a/docs/reference/Exp-class.html +++ b/docs/reference/Exp-class.html @@ -1,9 +1,9 @@ -The Exp class. — Exp-class • CVXRThe Exp class. — Exp-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,55 +68,57 @@

The Exp class.

Exp(x)
 
-# S4 method for Exp
+# S4 method for class 'Exp'
 to_numeric(object, values)
 
-# S4 method for Exp
+# S4 method for class 'Exp'
 sign_from_args(object)
 
-# S4 method for Exp
+# S4 method for class 'Exp'
 is_atom_convex(object)
 
-# S4 method for Exp
+# S4 method for class 'Exp'
 is_atom_concave(object)
 
-# S4 method for Exp
+# S4 method for class 'Exp'
 is_atom_log_log_convex(object)
 
-# S4 method for Exp
+# S4 method for class 'Exp'
 is_atom_log_log_concave(object)
 
-# S4 method for Exp
+# S4 method for class 'Exp'
 is_incr(object, idx)
 
-# S4 method for Exp
+# S4 method for class 'Exp'
 is_decr(object, idx)
 
-# S4 method for Exp
+# S4 method for class 'Exp'
 .grad(object, values)

Arguments

-
x
+ + +
x

An Expression object.

-
object
+
object

An Exp object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(Exp): The matrix with each element exponentiated.

  • sign_from_args(Exp): The atom is positive.

  • is_atom_convex(Exp): The atom is convex.

  • @@ -129,7 +131,7 @@

    Methods (by generic)

Slots

- +
x

An Expression object.

@@ -149,15 +151,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ExpCone-class.html b/docs/reference/ExpCone-class.html index dbc27c25..9f50b269 100644 --- a/docs/reference/ExpCone-class.html +++ b/docs/reference/ExpCone-class.html @@ -1,9 +1,9 @@ -The ExpCone class. — ExpCone-class • CVXRThe ExpCone class. — ExpCone-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,50 +68,52 @@

The ExpCone class.

ExpCone(x, y, z, id = NA_integer_)
 
-# S4 method for ExpCone
+# S4 method for class 'ExpCone'
 as.character(x)
 
-# S4 method for ExpCone
+# S4 method for class 'ExpCone'
 residual(object)
 
-# S4 method for ExpCone
+# S4 method for class 'ExpCone'
 size(object)
 
-# S4 method for ExpCone
+# S4 method for class 'ExpCone'
 num_cones(object)
 
-# S4 method for ExpCone
+# S4 method for class 'ExpCone'
 cone_sizes(object)
 
-# S4 method for ExpCone
+# S4 method for class 'ExpCone'
 is_dcp(object)
 
-# S4 method for ExpCone
+# S4 method for class 'ExpCone'
 is_dgp(object)
 
-# S4 method for ExpCone
+# S4 method for class 'ExpCone'
 canonicalize(object)

Arguments

-
x
+ + +
x

The variable \(x\) in the exponential cone.

-
y
+
y

The variable \(y\) in the exponential cone.

-
z
+
z

The variable \(z\) in the exponential cone.

-
id
+
id

(Optional) A numeric value representing the constraint ID.

-
object
+
object

A ExpCone object.

@@ -128,7 +130,7 @@

Details

Methods (by generic)

- +
  • residual(ExpCone): The size of the x argument.

  • size(ExpCone): The number of entries in the combined cones.

  • num_cones(ExpCone): The number of elementwise cones.

  • @@ -139,7 +141,7 @@

    Methods (by generic)

Slots

- +
x

The variable \(x\) in the exponential cone.

@@ -167,15 +169,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ExpCone.html b/docs/reference/ExpCone.html new file mode 100644 index 00000000..ec35993c --- /dev/null +++ b/docs/reference/ExpCone.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Expression-class.html b/docs/reference/Expression-class.html index fe15a370..9d01b0bb 100644 --- a/docs/reference/Expression-class.html +++ b/docs/reference/Expression-class.html @@ -1,9 +1,9 @@ -The Expression class. — Expression-class • CVXRThe Expression class. — Expression-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,130 +66,132 @@

The Expression class.

-
# S4 method for Expression
+    
# S4 method for class 'Expression'
 value(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 grad(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 domain(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 as.character(x)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 name(x)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 expr(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_constant(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_affine(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_convex(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_concave(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_dcp(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_log_log_constant(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_log_log_affine(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_log_log_convex(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_log_log_concave(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_dgp(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_hermitian(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_psd(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_nsd(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_quadratic(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_symmetric(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_pwl(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_qpwa(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_zero(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_nonneg(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_nonpos(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 dim(x)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_real(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_imag(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_complex(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 size(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 ndim(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 flatten(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_scalar(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_vector(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 is_matrix(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 nrow(x)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 ncol(x)

Arguments

-
x, object
+ + +
x, object

An Expression object.

Methods (by generic)

- +
  • value(Expression): The value of the expression.

  • grad(Expression): The (sub/super)-gradient of the expression with respect to each variable.

  • domain(Expression): A list of constraints describing the closure of the region where the expression is finite.

  • @@ -242,15 +244,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Expression.html b/docs/reference/Expression.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/Expression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/EyeMinusInv-class.html b/docs/reference/EyeMinusInv-class.html index 4a17d192..34cad081 100644 --- a/docs/reference/EyeMinusInv-class.html +++ b/docs/reference/EyeMinusInv-class.html @@ -1,11 +1,11 @@ The EyeMinusInv class. — EyeMinusInv-class • CVXR - +
@@ -30,7 +30,7 @@
- +
@@ -72,61 +72,63 @@

The EyeMinusInv class.

EyeMinusInv(X)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 to_numeric(object, values)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 name(x)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 dim_from_args(object)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 sign_from_args(object)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 is_atom_convex(object)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 is_atom_concave(object)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 is_atom_log_log_convex(object)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 is_atom_log_log_concave(object)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 is_incr(object, idx)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 is_decr(object, idx)
 
-# S4 method for EyeMinusInv
+# S4 method for class 'EyeMinusInv'
 .grad(object, values)

Arguments

-
X
+ + +
X

An Expression or numeric matrix.

-
object, x
+
object, x

An EyeMinusInv object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(EyeMinusInv): The unity resolvent of the matrix.

  • name(EyeMinusInv): The name and arguments of the atom.

  • dim_from_args(EyeMinusInv): The dimensions of the atom determined from its arguments.

  • @@ -141,7 +143,7 @@

    Methods (by generic)

Slots

- +
X

An Expression or numeric matrix.

@@ -161,15 +163,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/EyeMinusInv.html b/docs/reference/EyeMinusInv.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/EyeMinusInv.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/FlipObjective-class.html b/docs/reference/FlipObjective-class.html index 83ef6a82..2e3a3c35 100644 --- a/docs/reference/FlipObjective-class.html +++ b/docs/reference/FlipObjective-class.html @@ -1,10 +1,10 @@ The FlipObjective class. — FlipObjective-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -68,34 +68,36 @@

The FlipObjective class.

-
# S4 method for FlipObjective,Problem
+    
# S4 method for class 'FlipObjective,Problem'
 perform(object, problem)
 
-# S4 method for FlipObjective,Solution,list
+# S4 method for class 'FlipObjective,Solution,list'
 invert(object, solution, inverse_data)

Arguments

-
object
+ + +
object

A FlipObjective object.

-
problem
+
problem

A Problem object.

-
solution
+
solution

A Solution to a problem that generated the inverse data.

-
inverse_data
+
inverse_data

The inverse data returned by an invocation to apply.

Methods (by generic)

- +
  • perform(object = FlipObjective, problem = Problem): Flip a minimization objective to a maximization and vice versa.

  • invert(object = FlipObjective, solution = Solution, inverse_data = list): Map the solution of the flipped problem to that of the original.

@@ -112,15 +114,15 @@

Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/FlipObjective.html b/docs/reference/FlipObjective.html new file mode 100644 index 00000000..2195cea9 --- /dev/null +++ b/docs/reference/FlipObjective.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/GLPK-class.html b/docs/reference/GLPK-class.html index bb63975c..eeedef70 100644 --- a/docs/reference/GLPK-class.html +++ b/docs/reference/GLPK-class.html @@ -1,9 +1,9 @@ -An interface for the GLPK solver. — GLPK-class • CVXRAn interface for the GLPK solver. — GLPK-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,22 +68,22 @@

An interface for the GLPK solver.

GLPK()
 
-# S4 method for GLPK
+# S4 method for class 'GLPK'
 mip_capable(solver)
 
-# S4 method for GLPK
+# S4 method for class 'GLPK'
 status_map(solver, status)
 
-# S4 method for GLPK
+# S4 method for class 'GLPK'
 name(x)
 
-# S4 method for GLPK
+# S4 method for class 'GLPK'
 import_solver(solver)
 
-# S4 method for GLPK,list,list
+# S4 method for class 'GLPK,list,list'
 invert(object, solution, inverse_data)
 
-# S4 method for GLPK
+# S4 method for class 'GLPK'
 solve_via_data(
   object,
   data,
@@ -100,61 +100,63 @@ 

An interface for the GLPK solver.

Arguments

-
solver, object, x
+ + +
solver, object, x

A GLPK object.

-
status
+
status

A status code returned by the solver.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A list containing data necessary for the inversion.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance.

-
reltol
+
reltol

The relative tolerance.

-
abstol
+
abstol

The absolute tolerance.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(GLPK): Can the solver handle mixed-integer programs?

  • status_map(GLPK): Converts status returned by the GLPK solver to its respective CVXPY status.

  • name(GLPK): Returns the name of the solver.

  • @@ -175,15 +177,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/GLPK.html b/docs/reference/GLPK.html new file mode 100644 index 00000000..b74a96a9 --- /dev/null +++ b/docs/reference/GLPK.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/GLPK_MI-class.html b/docs/reference/GLPK_MI-class.html index d404cc4a..c9ab8616 100644 --- a/docs/reference/GLPK_MI-class.html +++ b/docs/reference/GLPK_MI-class.html @@ -1,9 +1,9 @@ -An interface for the GLPK MI solver. — GLPK_MI-class • CVXRAn interface for the GLPK MI solver. — GLPK_MI-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,16 +68,16 @@

An interface for the GLPK MI solver.

GLPK_MI()
 
-# S4 method for GLPK_MI
+# S4 method for class 'GLPK_MI'
 mip_capable(solver)
 
-# S4 method for GLPK_MI
+# S4 method for class 'GLPK_MI'
 status_map(solver, status)
 
-# S4 method for GLPK_MI
+# S4 method for class 'GLPK_MI'
 name(x)
 
-# S4 method for GLPK_MI
+# S4 method for class 'GLPK_MI'
 solve_via_data(
   object,
   data,
@@ -94,53 +94,55 @@ 

An interface for the GLPK MI solver.

Arguments

-
solver, object, x
+ + +
solver, object, x

A GLPK_MI object.

-
status
+
status

A status code returned by the solver.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance.

-
reltol
+
reltol

The relative tolerance.

-
abstol
+
abstol

The absolute tolerance.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(GLPK_MI): Can the solver handle mixed-integer programs?

  • status_map(GLPK_MI): Converts status returned by the GLPK_MI solver to its respective CVXPY status.

  • name(GLPK_MI): Returns the name of the solver.

  • @@ -159,15 +161,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/GLPK_MI.html b/docs/reference/GLPK_MI.html new file mode 100644 index 00000000..b8d9c012 --- /dev/null +++ b/docs/reference/GLPK_MI.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/GUROBI_CONIC-class.html b/docs/reference/GUROBI_CONIC-class.html index ccacf48b..4f1eba4b 100644 --- a/docs/reference/GUROBI_CONIC-class.html +++ b/docs/reference/GUROBI_CONIC-class.html @@ -1,9 +1,9 @@ -An interface for the GUROBI conic solver. — GUROBI_CONIC-class • CVXRAn interface for the GUROBI conic solver. — GUROBI_CONIC-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,28 +68,28 @@

An interface for the GUROBI conic solver.

GUROBI_CONIC()
 
-# S4 method for GUROBI_CONIC
+# S4 method for class 'GUROBI_CONIC'
 mip_capable(solver)
 
-# S4 method for GUROBI_CONIC
+# S4 method for class 'GUROBI_CONIC'
 name(x)
 
-# S4 method for GUROBI_CONIC
+# S4 method for class 'GUROBI_CONIC'
 import_solver(solver)
 
-# S4 method for GUROBI_CONIC
+# S4 method for class 'GUROBI_CONIC'
 status_map(solver, status)
 
-# S4 method for GUROBI_CONIC,Problem
+# S4 method for class 'GUROBI_CONIC,Problem'
 accepts(object, problem)
 
-# S4 method for GUROBI_CONIC,Problem
+# S4 method for class 'GUROBI_CONIC,Problem'
 perform(object, problem)
 
-# S4 method for GUROBI_CONIC,list,list
+# S4 method for class 'GUROBI_CONIC,list,list'
 invert(object, solution, inverse_data)
 
-# S4 method for GUROBI_CONIC
+# S4 method for class 'GUROBI_CONIC'
 solve_via_data(
   object,
   data,
@@ -106,65 +106,67 @@ 

An interface for the GUROBI conic solver.

Arguments

-
solver, object, x
+ + +
solver, object, x

A GUROBI_CONIC object.

-
status
+
status

A status code returned by the solver.

-
problem
+
problem

A Problem object.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A list containing data necessary for the inversion.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance.

-
reltol
+
reltol

The relative tolerance.

-
abstol
+
abstol

The absolute tolerance.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(GUROBI_CONIC): Can the solver handle mixed-integer programs?

  • name(GUROBI_CONIC): Returns the name of the solver.

  • import_solver(GUROBI_CONIC): Imports the solver.

  • @@ -187,15 +189,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/GUROBI_CONIC.html b/docs/reference/GUROBI_CONIC.html new file mode 100644 index 00000000..f4a1f642 --- /dev/null +++ b/docs/reference/GUROBI_CONIC.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/GUROBI_QP-class.html b/docs/reference/GUROBI_QP-class.html index 612b1eed..2a417c10 100644 --- a/docs/reference/GUROBI_QP-class.html +++ b/docs/reference/GUROBI_QP-class.html @@ -1,9 +1,9 @@ -An interface for the GUROBI_QP solver. — GUROBI_QP-class • CVXRAn interface for the GUROBI_QP solver. — GUROBI_QP-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,19 +68,19 @@

An interface for the GUROBI_QP solver.

GUROBI_QP()
 
-# S4 method for GUROBI_QP
+# S4 method for class 'GUROBI_QP'
 mip_capable(solver)
 
-# S4 method for GUROBI_QP
+# S4 method for class 'GUROBI_QP'
 status_map(solver, status)
 
-# S4 method for GUROBI_QP
+# S4 method for class 'GUROBI_QP'
 name(x)
 
-# S4 method for GUROBI_QP
+# S4 method for class 'GUROBI_QP'
 import_solver(solver)
 
-# S4 method for GUROBI_QP
+# S4 method for class 'GUROBI_QP'
 solve_via_data(
   object,
   data,
@@ -94,67 +94,69 @@ 

An interface for the GUROBI_QP solver.

solver_cache ) -# S4 method for GUROBI_QP,list,InverseData +# S4 method for class 'GUROBI_QP,list,InverseData' invert(object, solution, inverse_data)

Arguments

-
solver, object, x
+ + +
solver, object, x

A GUROBI_QP object.

-
status
+
status

A status code returned by the solver.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance.

-
reltol
+
reltol

The relative tolerance.

-
abstol
+
abstol

The absolute tolerance.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A InverseData object containing data necessary for the inversion.

Methods (by generic)

- +
  • mip_capable(GUROBI_QP): Can the solver handle mixed-integer programs?

  • status_map(GUROBI_QP): Converts status returned by the GUROBI solver to its respective CVXPY status.

  • name(GUROBI_QP): Returns the name of the solver.

  • @@ -175,15 +177,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/GUROBI_QP.html b/docs/reference/GUROBI_QP.html new file mode 100644 index 00000000..de519b9c --- /dev/null +++ b/docs/reference/GUROBI_QP.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/GeoMean-class.html b/docs/reference/GeoMean-class.html index 05a51efb..edea9acd 100644 --- a/docs/reference/GeoMean-class.html +++ b/docs/reference/GeoMean-class.html @@ -1,9 +1,9 @@ -The GeoMean class. — GeoMean-class • CVXRThe GeoMean class. — GeoMean-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,80 +68,82 @@

The GeoMean class.

GeoMean(x, p = NA_real_, max_denom = 1024)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 to_numeric(object, values)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 .domain(object)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 .grad(object, values)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 name(x)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 dim_from_args(object)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 sign_from_args(object)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 is_atom_convex(object)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 is_atom_concave(object)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 is_atom_log_log_convex(object)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 is_atom_log_log_concave(object)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 is_incr(object, idx)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 is_decr(object, idx)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 get_data(object)
 
-# S4 method for GeoMean
+# S4 method for class 'GeoMean'
 copy(object, args = NULL, id_objects = list())

Arguments

-
x
+ + +
x

An Expression or numeric vector.

-
p
+
p

(Optional) A vector of weights for the weighted geometric mean. The default is a vector of ones, giving the unweighted geometric mean \(x_1^{1/n} \cdots x_n^{1/n}\).

-
max_denom
+
max_denom

(Optional) The maximum denominator to use in approximating p/sum(p) with w. If w is not an exact representation, increasing max_denom may offer a more accurate representation, at the cost of requiring more convex inequalities to represent the geometric mean. Defaults to 1024.

-
object
+
object

A GeoMean object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

-
args
+
args

An optional list that contains the arguments to reconstruct the atom. Default is to use current arguments of the atom.

-
id_objects
+
id_objects

Currently unused.

@@ -154,7 +156,7 @@

Details

Methods (by generic)

- +
  • to_numeric(GeoMean): The (weighted) geometric mean of the elements of x.

  • .domain(GeoMean): Returns constraints describing the domain of the node

  • .grad(GeoMean): Gives the (sub/super)gradient of the atom w.r.t. each variable

  • @@ -172,7 +174,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric vector.

@@ -208,15 +210,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/GeoMean.html b/docs/reference/GeoMean.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/GeoMean.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/HStack-class.html b/docs/reference/HStack-class.html index cc935379..a41083e6 100644 --- a/docs/reference/HStack-class.html +++ b/docs/reference/HStack-class.html @@ -1,9 +1,9 @@ -The HStack class. — HStack-class • CVXRThe HStack class. — HStack-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,54 +68,56 @@

The HStack class.

HStack(...)
 
-# S4 method for HStack
+# S4 method for class 'HStack'
 to_numeric(object, values)
 
-# S4 method for HStack
+# S4 method for class 'HStack'
 dim_from_args(object)
 
-# S4 method for HStack
+# S4 method for class 'HStack'
 is_atom_log_log_convex(object)
 
-# S4 method for HStack
+# S4 method for class 'HStack'
 is_atom_log_log_concave(object)
 
-# S4 method for HStack
+# S4 method for class 'HStack'
 validate_args(object)
 
-# S4 method for HStack
+# S4 method for class 'HStack'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
...
+ + +
...

Expression objects or matrices. All arguments must have the same dimensions except for axis 2 (columns).

-
object
+
object

A HStack object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(HStack): Horizontally concatenate the values using cbind.

  • dim_from_args(HStack): The dimensions of the atom.

  • is_atom_log_log_convex(HStack): Is the atom log-log convex?

  • @@ -125,7 +127,7 @@

    Methods (by generic)

Slots

- +
...

Expression objects or matrices. All arguments must have the same dimensions except for axis 2 (columns).

@@ -145,15 +147,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/HarmonicMean.html b/docs/reference/HarmonicMean.html index 5a529fc1..83c7717a 100644 --- a/docs/reference/HarmonicMean.html +++ b/docs/reference/HarmonicMean.html @@ -1,9 +1,9 @@ -The HarmonicMean atom. — HarmonicMean • CVXRThe HarmonicMean atom. — HarmonicMean • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

The HarmonicMean atom.

Arguments

-
x
+ + +
x

An expression or number whose harmonic mean is to be computed. Must have positive entries.

Value

- - -

The harmonic mean of x.

+

The harmonic mean of x.

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Huber-class.html b/docs/reference/Huber-class.html index 693774f5..7c62cdfc 100644 --- a/docs/reference/Huber-class.html +++ b/docs/reference/Huber-class.html @@ -6,13 +6,13 @@ \(|x|^2\) for \(|x| \leq |M|.\) - -"> - +
@@ -37,7 +37,7 @@
- +
@@ -77,68 +77,70 @@

The Huber class.

\(|x|^2\)

for \(|x| \leq |M|.\)

- +
Huber(x, M = 1)
 
-# S4 method for Huber
+# S4 method for class 'Huber'
 to_numeric(object, values)
 
-# S4 method for Huber
+# S4 method for class 'Huber'
 sign_from_args(object)
 
-# S4 method for Huber
+# S4 method for class 'Huber'
 is_atom_convex(object)
 
-# S4 method for Huber
+# S4 method for class 'Huber'
 is_atom_concave(object)
 
-# S4 method for Huber
+# S4 method for class 'Huber'
 is_incr(object, idx)
 
-# S4 method for Huber
+# S4 method for class 'Huber'
 is_decr(object, idx)
 
-# S4 method for Huber
+# S4 method for class 'Huber'
 is_quadratic(object)
 
-# S4 method for Huber
+# S4 method for class 'Huber'
 get_data(object)
 
-# S4 method for Huber
+# S4 method for class 'Huber'
 validate_args(object)
 
-# S4 method for Huber
+# S4 method for class 'Huber'
 .grad(object, values)

Arguments

-
x
+ + +
x

An Expression object.

-
M
+
M

A positive scalar value representing the threshold. Defaults to 1.

-
object
+
object

A Huber object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(Huber): The Huber function evaluted elementwise on the input value.

  • sign_from_args(Huber): The atom is positive.

  • is_atom_convex(Huber): The atom is convex.

  • @@ -152,7 +154,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric constant.

@@ -176,15 +178,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Im,Expression-method.html b/docs/reference/Im,Expression-method.html new file mode 100644 index 00000000..654227e9 --- /dev/null +++ b/docs/reference/Im,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Imag-class.html b/docs/reference/Imag-class.html index bafe1b87..8329f5b1 100644 --- a/docs/reference/Imag-class.html +++ b/docs/reference/Imag-class.html @@ -1,9 +1,9 @@ -The Imag class. — Imag-class • CVXRThe Imag class. — Imag-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,39 +68,41 @@

The Imag class.

Imag(expr)
 
-# S4 method for Imag
+# S4 method for class 'Imag'
 to_numeric(object, values)
 
-# S4 method for Imag
+# S4 method for class 'Imag'
 dim_from_args(object)
 
-# S4 method for Imag
+# S4 method for class 'Imag'
 is_imag(object)
 
-# S4 method for Imag
+# S4 method for class 'Imag'
 is_complex(object)
 
-# S4 method for Imag
+# S4 method for class 'Imag'
 is_symmetric(object)

Arguments

-
expr
+ + +
expr

An Expression representing a vector or matrix.

-
object
+
object

An Imag object.

-
values
+
values

A list of arguments to the atom.

Methods (by generic)

- +
  • to_numeric(Imag): The imaginary part of the given value.

  • dim_from_args(Imag): The dimensions of the atom.

  • is_imag(Imag): Is the atom imaginary?

  • @@ -109,7 +111,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression representing a vector or matrix.

@@ -129,15 +131,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Imag.html b/docs/reference/Imag.html new file mode 100644 index 00000000..162e57af --- /dev/null +++ b/docs/reference/Imag.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Index-class.html b/docs/reference/Index-class.html index 876d1791..9ed4e015 100644 --- a/docs/reference/Index-class.html +++ b/docs/reference/Index-class.html @@ -1,9 +1,9 @@ -The Index class. — [,Expression,missing,missing,ANY-method • CVXRThe Index class. — [,Expression,missing,missing,ANY-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,94 +66,96 @@

The Index class.

-
# S4 method for Expression,missing,missing,ANY
-[(x, i, j, ..., drop = TRUE)
-
-# S4 method for Expression,numeric,missing,ANY
-[(x, i, j, ..., drop = TRUE)
-
-# S4 method for Expression,missing,numeric,ANY
-[(x, i, j, ..., drop = TRUE)
-
-# S4 method for Expression,numeric,numeric,ANY
-[(x, i, j, ..., drop = TRUE)
-
-Index(expr, key)
-
-# S4 method for Index
-to_numeric(object, values)
-
-# S4 method for Index
-dim_from_args(object)
-
-# S4 method for Index
-is_atom_log_log_convex(object)
-
-# S4 method for Index
-is_atom_log_log_concave(object)
-
-# S4 method for Index
-get_data(object)
-
-# S4 method for Index
-graph_implementation(object, arg_objs, dim, data = NA_real_)
-
-# S4 method for SpecialIndex
-to_numeric(object, values)
-
-# S4 method for SpecialIndex
-dim_from_args(object)
+
# S4 method for class 'Expression,missing,missing,ANY'
+x[i, j, ..., drop = TRUE]
+
+# S4 method for class 'Expression,numeric,missing,ANY'
+x[i, j, ..., drop = TRUE]
+
+# S4 method for class 'Expression,missing,numeric,ANY'
+x[i, j, ..., drop = TRUE]
+
+# S4 method for class 'Expression,numeric,numeric,ANY'
+x[i, j, ..., drop = TRUE]
+
+Index(expr, key)
+
+# S4 method for class 'Index'
+to_numeric(object, values)
+
+# S4 method for class 'Index'
+dim_from_args(object)
+
+# S4 method for class 'Index'
+is_atom_log_log_convex(object)
+
+# S4 method for class 'Index'
+is_atom_log_log_concave(object)
+
+# S4 method for class 'Index'
+get_data(object)
+
+# S4 method for class 'Index'
+graph_implementation(object, arg_objs, dim, data = NA_real_)
+
+# S4 method for class 'SpecialIndex'
+to_numeric(object, values)
+
+# S4 method for class 'SpecialIndex'
+dim_from_args(object)

Arguments

-
x
+ + +
x

A Expression object.

-
i, j
+
i, j

The row and column indices of the slice.

-
...
+
...

(Unimplemented) Optional arguments.

-
drop
+
drop

(Unimplemented) A logical value indicating whether the result should be coerced to the lowest possible dimension.

-
expr
+
expr

An Expression representing a vector or matrix.

-
key
+
key

A list containing the start index, end index, and step size of the slice.

-
object
+
object

An Index object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(Index): The index/slice into the given value.

  • dim_from_args(Index): The dimensions of the atom.

  • is_atom_log_log_convex(Index): Is the atom log-log convex?

  • @@ -165,7 +167,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression representing a vector or matrix.

@@ -189,15 +191,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/IneqConstraint-class.html b/docs/reference/IneqConstraint-class.html index 322d5f0d..f522ca69 100644 --- a/docs/reference/IneqConstraint-class.html +++ b/docs/reference/IneqConstraint-class.html @@ -1,9 +1,9 @@ -The IneqConstraint class — <=,Expression,Expression-method • CVXRThe IneqConstraint class — <=,Expression,Expression-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,77 +66,79 @@

The IneqConstraint class

-
# S4 method for Expression,Expression
-&lt;=(e1, e2)
-
-# S4 method for Expression,ConstVal
-&lt;=(e1, e2)
-
-# S4 method for ConstVal,Expression
-&lt;=(e1, e2)
-
-# S4 method for Expression,Expression
-&lt;(e1, e2)
-
-# S4 method for Expression,ConstVal
-&lt;(e1, e2)
-
-# S4 method for ConstVal,Expression
-&lt;(e1, e2)
-
-# S4 method for Expression,Expression
-&gt;=(e1, e2)
-
-# S4 method for Expression,ConstVal
-&gt;=(e1, e2)
-
-# S4 method for ConstVal,Expression
-&gt;=(e1, e2)
-
-# S4 method for Expression,Expression
-&gt;(e1, e2)
-
-# S4 method for Expression,ConstVal
-&gt;(e1, e2)
-
-# S4 method for ConstVal,Expression
-&gt;(e1, e2)
-
-# S4 method for IneqConstraint
-name(x)
-
-# S4 method for IneqConstraint
-dim(x)
-
-# S4 method for IneqConstraint
-size(object)
-
-# S4 method for IneqConstraint
-expr(object)
-
-# S4 method for IneqConstraint
-is_dcp(object)
-
-# S4 method for IneqConstraint
-is_dgp(object)
-
-# S4 method for IneqConstraint
-residual(object)
+
# S4 method for class 'Expression,Expression'
+e1 <= e2
+
+# S4 method for class 'Expression,ConstVal'
+e1 <= e2
+
+# S4 method for class 'ConstVal,Expression'
+e1 <= e2
+
+# S4 method for class 'Expression,Expression'
+e1 < e2
+
+# S4 method for class 'Expression,ConstVal'
+e1 < e2
+
+# S4 method for class 'ConstVal,Expression'
+e1 < e2
+
+# S4 method for class 'Expression,Expression'
+e1 >= e2
+
+# S4 method for class 'Expression,ConstVal'
+e1 >= e2
+
+# S4 method for class 'ConstVal,Expression'
+e1 >= e2
+
+# S4 method for class 'Expression,Expression'
+e1 > e2
+
+# S4 method for class 'Expression,ConstVal'
+e1 > e2
+
+# S4 method for class 'ConstVal,Expression'
+e1 > e2
+
+# S4 method for class 'IneqConstraint'
+name(x)
+
+# S4 method for class 'IneqConstraint'
+dim(x)
+
+# S4 method for class 'IneqConstraint'
+size(object)
+
+# S4 method for class 'IneqConstraint'
+expr(object)
+
+# S4 method for class 'IneqConstraint'
+is_dcp(object)
+
+# S4 method for class 'IneqConstraint'
+is_dgp(object)
+
+# S4 method for class 'IneqConstraint'
+residual(object)

Arguments

-
e1, e2
+ + +
e1, e2

The Expression objects or numeric constants to compare.

-
x, object
+
x, object

A IneqConstraint object.

Methods (by generic)

- +
  • name(IneqConstraint): The string representation of the constraint.

  • dim(IneqConstraint): The dimensions of the constrained expression.

  • size(IneqConstraint): The size of the constrained expression.

  • @@ -158,15 +160,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/InverseData-class.html b/docs/reference/InverseData-class.html index 82e8b1b0..9e13143a 100644 --- a/docs/reference/InverseData-class.html +++ b/docs/reference/InverseData-class.html @@ -1,9 +1,9 @@ -The InverseData class. — InverseData-class • CVXRThe InverseData class. — InverseData-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -79,15 +79,15 @@

The InverseData class.

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/KLDiv-class.html b/docs/reference/KLDiv-class.html index 0ba25d80..aeb1d4b5 100644 --- a/docs/reference/KLDiv-class.html +++ b/docs/reference/KLDiv-class.html @@ -1,9 +1,9 @@ -The KLDiv class. — KLDiv-class • CVXRThe KLDiv class. — KLDiv-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,56 +68,58 @@

The KLDiv class.

KLDiv(x, y)
 
-# S4 method for KLDiv
+# S4 method for class 'KLDiv'
 to_numeric(object, values)
 
-# S4 method for KLDiv
+# S4 method for class 'KLDiv'
 sign_from_args(object)
 
-# S4 method for KLDiv
+# S4 method for class 'KLDiv'
 is_atom_convex(object)
 
-# S4 method for KLDiv
+# S4 method for class 'KLDiv'
 is_atom_concave(object)
 
-# S4 method for KLDiv
+# S4 method for class 'KLDiv'
 is_incr(object, idx)
 
-# S4 method for KLDiv
+# S4 method for class 'KLDiv'
 is_decr(object, idx)
 
-# S4 method for KLDiv
+# S4 method for class 'KLDiv'
 .grad(object, values)
 
-# S4 method for KLDiv
+# S4 method for class 'KLDiv'
 .domain(object)

Arguments

-
x
+ + +
x

An Expression or numeric constant.

-
y
+
y

An Expression or numeric constant.

-
object
+
object

A KLDiv object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(KLDiv): The KL-divergence evaluted elementwise on the input value.

  • sign_from_args(KLDiv): The atom is positive.

  • is_atom_convex(KLDiv): The atom is convex.

  • @@ -129,7 +131,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric constant.

@@ -153,15 +155,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/KLDiv.html b/docs/reference/KLDiv.html new file mode 100644 index 00000000..fa937a81 --- /dev/null +++ b/docs/reference/KLDiv.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Kron-class.html b/docs/reference/Kron-class.html index 464b1c2b..866633cb 100644 --- a/docs/reference/Kron-class.html +++ b/docs/reference/Kron-class.html @@ -1,9 +1,9 @@ -The Kron class. — Kron-class • CVXRThe Kron class. — Kron-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,65 +68,67 @@

The Kron class.

Kron(lh_exp, rh_exp)
 
-# S4 method for Kron
+# S4 method for class 'Kron'
 to_numeric(object, values)
 
-# S4 method for Kron
+# S4 method for class 'Kron'
 validate_args(object)
 
-# S4 method for Kron
+# S4 method for class 'Kron'
 dim_from_args(object)
 
-# S4 method for Kron
+# S4 method for class 'Kron'
 sign_from_args(object)
 
-# S4 method for Kron
+# S4 method for class 'Kron'
 is_incr(object, idx)
 
-# S4 method for Kron
+# S4 method for class 'Kron'
 is_decr(object, idx)
 
-# S4 method for Kron
+# S4 method for class 'Kron'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
lh_exp
+ + +
lh_exp

An Expression or numeric constant representing the left-hand matrix.

-
rh_exp
+
rh_exp

An Expression or numeric constant representing the right-hand matrix.

-
object
+
object

A Kron object.

-
values
+
values

A list of arguments to the atom.

-
idx
+
idx

An index into the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector with two elements representing the size of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(Kron): The kronecker product of the two values.

  • validate_args(Kron): Check both arguments are vectors and the first is a constant.

  • dim_from_args(Kron): The dimensions of the atom.

  • @@ -137,7 +139,7 @@

    Methods (by generic)

Slots

- +
lh_exp

An Expression or numeric constant representing the left-hand matrix.

@@ -161,15 +163,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Kron.html b/docs/reference/Kron.html new file mode 100644 index 00000000..1b6e7ff6 --- /dev/null +++ b/docs/reference/Kron.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/LambdaMax-class.html b/docs/reference/LambdaMax-class.html index 9a3a0ae7..91de261c 100644 --- a/docs/reference/LambdaMax-class.html +++ b/docs/reference/LambdaMax-class.html @@ -1,9 +1,9 @@ -The LambdaMax class. — LambdaMax-class • CVXRThe LambdaMax class. — LambdaMax-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,58 +68,60 @@

The LambdaMax class.

LambdaMax(A)
 
-# S4 method for LambdaMax
+# S4 method for class 'LambdaMax'
 to_numeric(object, values)
 
-# S4 method for LambdaMax
+# S4 method for class 'LambdaMax'
 .domain(object)
 
-# S4 method for LambdaMax
+# S4 method for class 'LambdaMax'
 .grad(object, values)
 
-# S4 method for LambdaMax
+# S4 method for class 'LambdaMax'
 validate_args(object)
 
-# S4 method for LambdaMax
+# S4 method for class 'LambdaMax'
 dim_from_args(object)
 
-# S4 method for LambdaMax
+# S4 method for class 'LambdaMax'
 sign_from_args(object)
 
-# S4 method for LambdaMax
+# S4 method for class 'LambdaMax'
 is_atom_convex(object)
 
-# S4 method for LambdaMax
+# S4 method for class 'LambdaMax'
 is_atom_concave(object)
 
-# S4 method for LambdaMax
+# S4 method for class 'LambdaMax'
 is_incr(object, idx)
 
-# S4 method for LambdaMax
+# S4 method for class 'LambdaMax'
 is_decr(object, idx)

Arguments

-
A
+ + +
A

An Expression or numeric matrix.

-
object
+
object

A LambdaMax object.

-
values
+
values

A list of arguments to the atom.

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(LambdaMax): The largest eigenvalue of A. Requires that A be symmetric.

  • .domain(LambdaMax): Returns the constraints describing the domain of the atom.

  • .grad(LambdaMax): Gives the (sub/super)gradient of the atom with respect to each argument. Matrix expressions are vectorized, so the gradient is a matrix.

  • @@ -133,7 +135,7 @@

    Methods (by generic)

Slots

- +
A

An Expression or numeric matrix.

@@ -153,15 +155,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/LambdaMax.html b/docs/reference/LambdaMax.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/LambdaMax.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/LambdaMin.html b/docs/reference/LambdaMin.html index 806f606e..53de2eec 100644 --- a/docs/reference/LambdaMin.html +++ b/docs/reference/LambdaMin.html @@ -1,9 +1,9 @@ -The LambdaMin atom. — LambdaMin • CVXRThe LambdaMin atom. — LambdaMin • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

The LambdaMin atom.

Arguments

-
A
+ + +
A

An Expression or numeric matrix.

Value

- - -

Returns the minimum eigenvalue of a matrix.

+

Returns the minimum eigenvalue of a matrix.

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/LambdaSumLargest-class.html b/docs/reference/LambdaSumLargest-class.html index 28beb9c7..4f11e085 100644 --- a/docs/reference/LambdaSumLargest-class.html +++ b/docs/reference/LambdaSumLargest-class.html @@ -1,9 +1,9 @@ -The LambdaSumLargest class. — LambdaSumLargest-class • CVXRThe LambdaSumLargest class. — LambdaSumLargest-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,43 +68,45 @@

The LambdaSumLargest class.

LambdaSumLargest(A, k)
 
-# S4 method for LambdaSumLargest
+# S4 method for class 'LambdaSumLargest'
 allow_complex(object)
 
-# S4 method for LambdaSumLargest
+# S4 method for class 'LambdaSumLargest'
 to_numeric(object, values)
 
-# S4 method for LambdaSumLargest
+# S4 method for class 'LambdaSumLargest'
 validate_args(object)
 
-# S4 method for LambdaSumLargest
+# S4 method for class 'LambdaSumLargest'
 get_data(object)
 
-# S4 method for LambdaSumLargest
+# S4 method for class 'LambdaSumLargest'
 .grad(object, values)

Arguments

-
A
+ + +
A

An Expression or numeric matrix.

-
k
+
k

A positive integer.

-
object
+
object

A LambdaSumLargest object.

-
values
+
values

A list of numeric values for the arguments

Methods (by generic)

- +
  • allow_complex(LambdaSumLargest): Does the atom handle complex numbers?

  • to_numeric(LambdaSumLargest): Returns the largest eigenvalue of A, which must be symmetric.

  • validate_args(LambdaSumLargest): Verify that the argument A is square.

  • @@ -113,7 +115,7 @@

    Methods (by generic)

Slots

- +
k

A positive integer.

@@ -133,15 +135,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/LambdaSumLargest.html b/docs/reference/LambdaSumLargest.html new file mode 100644 index 00000000..44111716 --- /dev/null +++ b/docs/reference/LambdaSumLargest.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/LambdaSumSmallest.html b/docs/reference/LambdaSumSmallest.html index 055677a1..1d081f2f 100644 --- a/docs/reference/LambdaSumSmallest.html +++ b/docs/reference/LambdaSumSmallest.html @@ -1,9 +1,9 @@ -The LambdaSumSmallest atom. — LambdaSumSmallest • CVXRThe LambdaSumSmallest atom. — LambdaSumSmallest • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

The LambdaSumSmallest atom.

Arguments

-
A
+ + +
A

An Expression or numeric matrix.

-
k
+
k

A positive integer.

Value

- - -

Returns the sum of the k smallest eigenvalues of a matrix.

+

Returns the sum of the k smallest eigenvalues of a matrix.

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Leaf-class.html b/docs/reference/Leaf-class.html index e1aa0780..84444bf8 100644 --- a/docs/reference/Leaf-class.html +++ b/docs/reference/Leaf-class.html @@ -1,9 +1,9 @@ -The Leaf class. — Leaf-class • CVXRThe Leaf class. — Leaf-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,108 +66,110 @@

The Leaf class.

-
# S4 method for Leaf
+    
# S4 method for class 'Leaf'
 get_data(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 dim(x)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 variables(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 parameters(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 constants(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 atoms(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_convex(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_concave(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_log_log_convex(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_log_log_concave(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_nonneg(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_nonpos(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_pos(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_neg(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_hermitian(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_symmetric(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_imag(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_complex(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 domain(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 project(object, value)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 project_and_assign(object, value)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 value(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 value(object) <- value
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 validate_val(object, val)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_psd(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_nsd(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_quadratic(object)
 
-# S4 method for Leaf
+# S4 method for class 'Leaf'
 is_pwl(object)

Arguments

-
object, x
+ + +
object, x

A Leaf object.

-
value
+
value

A numeric scalar, vector, or matrix.

-
val
+
val

The assigned value.

Methods (by generic)

- +
  • get_data(Leaf): Leaves are not copied.

  • dim(Leaf): The dimensions of the leaf node.

  • variables(Leaf): List of Variable objects in the leaf node.

  • @@ -199,7 +201,7 @@

    Methods (by generic)

Slots

- +
id

(Internal) A unique integer identification number used internally.

@@ -284,15 +286,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Leaf.html b/docs/reference/Leaf.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/Leaf.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/ListORConstr-class.html b/docs/reference/ListORConstr-class.html index 0b71cd1c..c0e57e02 100644 --- a/docs/reference/ListORConstr-class.html +++ b/docs/reference/ListORConstr-class.html @@ -1,9 +1,9 @@ -A Class Union of List and Constraint — ListORConstr-class • CVXRA Class Union of List and Constraint — ListORConstr-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,19 +66,21 @@

A Class Union of List and Constraint

-
# S4 method for ListORConstr
+    
# S4 method for class 'ListORConstr'
 id(object)

Arguments

-
object
+ + +
object

A list or Constraint object.

Methods (by generic)

- +
  • id(ListORConstr): Returns the ID associated with the list or constraint.

@@ -94,15 +96,15 @@

Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Log-class.html b/docs/reference/Log-class.html index d863779b..bbe9b1a6 100644 --- a/docs/reference/Log-class.html +++ b/docs/reference/Log-class.html @@ -1,9 +1,9 @@ -The Log class. — Log-class • CVXRThe Log class. — Log-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,58 +68,60 @@

The Log class.

Log(x)
 
-# S4 method for Log
+# S4 method for class 'Log'
 to_numeric(object, values)
 
-# S4 method for Log
+# S4 method for class 'Log'
 sign_from_args(object)
 
-# S4 method for Log
+# S4 method for class 'Log'
 is_atom_convex(object)
 
-# S4 method for Log
+# S4 method for class 'Log'
 is_atom_concave(object)
 
-# S4 method for Log
+# S4 method for class 'Log'
 is_atom_log_log_convex(object)
 
-# S4 method for Log
+# S4 method for class 'Log'
 is_atom_log_log_concave(object)
 
-# S4 method for Log
+# S4 method for class 'Log'
 is_incr(object, idx)
 
-# S4 method for Log
+# S4 method for class 'Log'
 is_decr(object, idx)
 
-# S4 method for Log
+# S4 method for class 'Log'
 .grad(object, values)
 
-# S4 method for Log
+# S4 method for class 'Log'
 .domain(object)

Arguments

-
x
+ + +
x

An Expression or numeric constant.

-
object
+
object

A Log object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(Log): The elementwise natural logarithm of the input value.

  • sign_from_args(Log): The sign of the atom is unknown.

  • is_atom_convex(Log): The atom is not convex.

  • @@ -133,7 +135,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric constant.

@@ -153,15 +155,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Log1p-class.html b/docs/reference/Log1p-class.html index a16c9a31..3dd8d3ce 100644 --- a/docs/reference/Log1p-class.html +++ b/docs/reference/Log1p-class.html @@ -1,9 +1,9 @@ -The Log1p class. — Log1p-class • CVXRThe Log1p class. — Log1p-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,36 +68,38 @@

The Log1p class.

Log1p(x)
 
-# S4 method for Log1p
+# S4 method for class 'Log1p'
 to_numeric(object, values)
 
-# S4 method for Log1p
+# S4 method for class 'Log1p'
 sign_from_args(object)
 
-# S4 method for Log1p
+# S4 method for class 'Log1p'
 .grad(object, values)
 
-# S4 method for Log1p
+# S4 method for class 'Log1p'
 .domain(object)

Arguments

-
x
+ + +
x

An Expression or numeric constant.

-
object
+
object

A Log1p object.

-
values
+
values

A list of numeric values for the arguments

Methods (by generic)

- +
  • to_numeric(Log1p): The elementwise natural logarithm of one plus the input value.

  • sign_from_args(Log1p): The sign of the atom.

  • .grad(Log1p): Gives the (sub/super)gradient of the atom w.r.t. each variable

  • @@ -105,7 +107,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric constant.

@@ -125,15 +127,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/LogDet-class.html b/docs/reference/LogDet-class.html index 2696fd90..a8e6d8b7 100644 --- a/docs/reference/LogDet-class.html +++ b/docs/reference/LogDet-class.html @@ -1,9 +1,9 @@ -The LogDet class. — LogDet-class • CVXRThe LogDet class. — LogDet-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,58 +68,60 @@

The LogDet class.

LogDet(A)
 
-# S4 method for LogDet
+# S4 method for class 'LogDet'
 to_numeric(object, values)
 
-# S4 method for LogDet
+# S4 method for class 'LogDet'
 validate_args(object)
 
-# S4 method for LogDet
+# S4 method for class 'LogDet'
 dim_from_args(object)
 
-# S4 method for LogDet
+# S4 method for class 'LogDet'
 sign_from_args(object)
 
-# S4 method for LogDet
+# S4 method for class 'LogDet'
 is_atom_convex(object)
 
-# S4 method for LogDet
+# S4 method for class 'LogDet'
 is_atom_concave(object)
 
-# S4 method for LogDet
+# S4 method for class 'LogDet'
 is_incr(object, idx)
 
-# S4 method for LogDet
+# S4 method for class 'LogDet'
 is_decr(object, idx)
 
-# S4 method for LogDet
+# S4 method for class 'LogDet'
 .grad(object, values)
 
-# S4 method for LogDet
+# S4 method for class 'LogDet'
 .domain(object)

Arguments

-
A
+ + +
A

An Expression or numeric matrix.

-
object
+
object

A LogDet object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(LogDet): The log-determinant of SDP matrix A. This is the sum of logs of the eigenvalues and is equivalent to the nuclear norm of the matrix logarithm of A.

  • validate_args(LogDet): Check that A is square.

  • dim_from_args(LogDet): The atom is a scalar.

  • @@ -133,7 +135,7 @@

    Methods (by generic)

Slots

- +
A

An Expression or numeric matrix.

@@ -153,15 +155,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/LogDet.html b/docs/reference/LogDet.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/LogDet.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/LogSumExp-class.html b/docs/reference/LogSumExp-class.html index e84d53f0..5129819e 100644 --- a/docs/reference/LogSumExp-class.html +++ b/docs/reference/LogSumExp-class.html @@ -1,9 +1,9 @@ -The LogSumExp class. — LogSumExp-class • CVXRThe LogSumExp class. — LogSumExp-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,64 +68,66 @@

The LogSumExp class.

LogSumExp(x, axis = NA_real_, keepdims = FALSE)
 
-# S4 method for LogSumExp
+# S4 method for class 'LogSumExp'
 to_numeric(object, values)
 
-# S4 method for LogSumExp
+# S4 method for class 'LogSumExp'
 .grad(object, values)
 
-# S4 method for LogSumExp
+# S4 method for class 'LogSumExp'
 .column_grad(object, value)
 
-# S4 method for LogSumExp
+# S4 method for class 'LogSumExp'
 sign_from_args(object)
 
-# S4 method for LogSumExp
+# S4 method for class 'LogSumExp'
 is_atom_convex(object)
 
-# S4 method for LogSumExp
+# S4 method for class 'LogSumExp'
 is_atom_concave(object)
 
-# S4 method for LogSumExp
+# S4 method for class 'LogSumExp'
 is_incr(object, idx)
 
-# S4 method for LogSumExp
+# S4 method for class 'LogSumExp'
 is_decr(object, idx)

Arguments

-
x
+ + +
x

An Expression representing a vector or matrix.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
object
+
object

A LogSumExp object.

-
values
+
values

A list of numeric values.

-
value
+
value

A numeric value.

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(LogSumExp): Evaluates \(e^x\) elementwise, sums, and takes the natural log.

  • .grad(LogSumExp): Gives the (sub/super)gradient of the atom w.r.t. each variable

  • .column_grad(LogSumExp): Gives the (sub/super)gradient of the atom w.r.t. each column variable.

  • @@ -137,7 +139,7 @@

    Methods (by generic)

Slots

- +
x

An Expression representing a vector or matrix.

@@ -165,15 +167,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/LogSumExp.html b/docs/reference/LogSumExp.html new file mode 100644 index 00000000..994650e9 --- /dev/null +++ b/docs/reference/LogSumExp.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Logistic-class.html b/docs/reference/Logistic-class.html index afc1455c..5fa3c242 100644 --- a/docs/reference/Logistic-class.html +++ b/docs/reference/Logistic-class.html @@ -1,11 +1,11 @@ The Logistic class. — Logistic-class • CVXR - +
@@ -30,7 +30,7 @@
- +
@@ -72,49 +72,51 @@

The Logistic class.

Logistic(x)
 
-# S4 method for Logistic
+# S4 method for class 'Logistic'
 to_numeric(object, values)
 
-# S4 method for Logistic
+# S4 method for class 'Logistic'
 sign_from_args(object)
 
-# S4 method for Logistic
+# S4 method for class 'Logistic'
 is_atom_convex(object)
 
-# S4 method for Logistic
+# S4 method for class 'Logistic'
 is_atom_concave(object)
 
-# S4 method for Logistic
+# S4 method for class 'Logistic'
 is_incr(object, idx)
 
-# S4 method for Logistic
+# S4 method for class 'Logistic'
 is_decr(object, idx)
 
-# S4 method for Logistic
+# S4 method for class 'Logistic'
 .grad(object, values)

Arguments

-
x
+ + +
x

An Expression or numeric constant.

-
object
+
object

A Logistic object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(Logistic): Evaluates e^x elementwise, adds one, and takes the natural logarithm.

  • sign_from_args(Logistic): The atom is positive.

  • is_atom_convex(Logistic): The atom is convex.

  • @@ -125,7 +127,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric constant.

@@ -145,15 +147,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MOSEK-class.html b/docs/reference/MOSEK-class.html index 6f21aeac..40b105f2 100644 --- a/docs/reference/MOSEK-class.html +++ b/docs/reference/MOSEK-class.html @@ -1,9 +1,9 @@ -An interface for the MOSEK solver. — MOSEK-class • CVXRAn interface for the MOSEK solver. — MOSEK-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,25 +68,25 @@

An interface for the MOSEK solver.

MOSEK()
 
-# S4 method for MOSEK
+# S4 method for class 'MOSEK'
 mip_capable(solver)
 
-# S4 method for MOSEK
+# S4 method for class 'MOSEK'
 import_solver(solver)
 
-# S4 method for MOSEK
+# S4 method for class 'MOSEK'
 name(x)
 
-# S4 method for MOSEK,Problem
+# S4 method for class 'MOSEK,Problem'
 accepts(object, problem)
 
-# S4 method for MOSEK
+# S4 method for class 'MOSEK'
 block_format(object, problem, constraints, exp_cone_order = NA)
 
-# S4 method for MOSEK,Problem
+# S4 method for class 'MOSEK,Problem'
 perform(object, problem)
 
-# S4 method for MOSEK
+# S4 method for class 'MOSEK'
 solve_via_data(
   object,
   data,
@@ -100,77 +100,79 @@ 

An interface for the MOSEK solver.

solver_cache ) -# S4 method for MOSEK,ANY,ANY +# S4 method for class 'MOSEK,ANY,ANY' invert(object, solution, inverse_data)

Arguments

-
solver, object, x
+ + +
solver, object, x

A MOSEK object.

-
problem
+
problem

A Problem object.

-
constraints
+
constraints

A list of Constraint objects for which coefficient andd offset data ("G", "h" respectively) is needed

-
exp_cone_order
+
exp_cone_order

A parameter that is only used when a Constraint object describes membership in the exponential cone.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance.

-
reltol
+
reltol

The relative tolerance.

-
abstol
+
abstol

The absolute tolerance.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A list containing data necessary for the inversion.

Methods (by generic)

- +
  • mip_capable(MOSEK): Can the solver handle mixed-integer programs?

  • import_solver(MOSEK): Imports the solver.

  • name(MOSEK): Returns the name of the solver.

  • @@ -197,15 +199,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MOSEK.html b/docs/reference/MOSEK.html new file mode 100644 index 00000000..4b67fe4e --- /dev/null +++ b/docs/reference/MOSEK.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/MOSEK.parse_dual_vars.html b/docs/reference/MOSEK.parse_dual_vars.html index 64f0d425..bc193e40 100644 --- a/docs/reference/MOSEK.parse_dual_vars.html +++ b/docs/reference/MOSEK.parse_dual_vars.html @@ -1,9 +1,9 @@ -Parses MOSEK dual variables into corresponding CVXR constraints and dual values — MOSEK.parse_dual_vars • CVXRParses MOSEK dual variables into corresponding CVXR constraints and dual values — MOSEK.parse_dual_vars • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Parses MOSEK dual variables into corresponding CVXR constraints and dual val

Arguments

-
dual_var
+ + +
dual_var

List of the dual variables returned by the MOSEK solution.

-
constr_id_to_constr_dim
+
constr_id_to_constr_dim

A list that contains the mapping of entry "id" that is the index of the CVXR Constraint object to which the next "dim" entries of the dual variable belong.

@@ -83,9 +85,7 @@

Arguments

Value

- - -

A list with the mapping of the CVXR Constraint object +

A list with the mapping of the CVXR Constraint object indices with the corresponding dual values.

@@ -101,15 +101,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MOSEK.recover_dual_variables.html b/docs/reference/MOSEK.recover_dual_variables.html index 1625d9d1..2f9a5380 100644 --- a/docs/reference/MOSEK.recover_dual_variables.html +++ b/docs/reference/MOSEK.recover_dual_variables.html @@ -1,9 +1,9 @@ -Recovers MOSEK solutions dual variables — MOSEK.recover_dual_variables • CVXRRecovers MOSEK solutions dual variables — MOSEK.recover_dual_variables • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,22 +71,20 @@

Recovers MOSEK solutions dual variables

Arguments

-
sol
+ + +
sol

List of the solutions returned by the MOSEK solver.

-
inverse_data
+
inverse_data

A list of the data returned by the perform function.

Value

- - -

A list containing the mapping of CVXR's Constraint

- - -

object's id to its corresponding dual variables in the current solution.

+

A list containing the mapping of CVXR's Constraint +object's id to its corresponding dual variables in the current solution.

@@ -101,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MatrixFrac-class.html b/docs/reference/MatrixFrac-class.html index 0fd779dc..7806c04f 100644 --- a/docs/reference/MatrixFrac-class.html +++ b/docs/reference/MatrixFrac-class.html @@ -1,9 +1,9 @@ -The MatrixFrac class. — MatrixFrac-class • CVXRThe MatrixFrac class. — MatrixFrac-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,71 +68,73 @@

The MatrixFrac class.

MatrixFrac(X, P)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 allow_complex(object)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 to_numeric(object, values)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 validate_args(object)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 dim_from_args(object)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 sign_from_args(object)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 is_atom_convex(object)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 is_atom_concave(object)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 is_incr(object, idx)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 is_decr(object, idx)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 is_quadratic(object)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 is_qpwa(object)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 .domain(object)
 
-# S4 method for MatrixFrac
+# S4 method for class 'MatrixFrac'
 .grad(object, values)

Arguments

-
X
+ + +
X

An Expression or numeric matrix.

-
P
+
P

An Expression or numeric matrix.

-
object
+
object

A MatrixFrac object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • allow_complex(MatrixFrac): Does the atom handle complex numbers?

  • to_numeric(MatrixFrac): The trace of \(X^TP^{-1}X\).

  • validate_args(MatrixFrac): Check that the dimensions of x and P match.

  • @@ -149,7 +151,7 @@

    Methods (by generic)

Slots

- +
X

An Expression or numeric matrix.

@@ -173,15 +175,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MatrixFrac.html b/docs/reference/MatrixFrac.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/MatrixFrac.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/MatrixStuffing-class.html b/docs/reference/MatrixStuffing-class.html index 7f82f54e..bc2fedeb 100644 --- a/docs/reference/MatrixStuffing-class.html +++ b/docs/reference/MatrixStuffing-class.html @@ -1,9 +1,9 @@ -The MatrixStuffing class. — MatrixStuffing-class • CVXRThe MatrixStuffing class. — MatrixStuffing-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,34 +66,36 @@

The MatrixStuffing class.

-
# S4 method for MatrixStuffing,Problem
+    
# S4 method for class 'MatrixStuffing,Problem'
 perform(object, problem)
 
-# S4 method for MatrixStuffing,Solution,InverseData
+# S4 method for class 'MatrixStuffing,Solution,InverseData'
 invert(object, solution, inverse_data)

Arguments

-
object
+ + +
object

A MatrixStuffing object.

-
problem
+
problem

A Problem object to stuff; the arguments of every constraint must be affine.

-
solution
+
solution

A Solution to a problem that generated the inverse data.

-
inverse_data
+
inverse_data

The data encoding the original problem.

Methods (by generic)

- +
  • perform(object = MatrixStuffing, problem = Problem): Returns a stuffed problem. The returned problem is a minimization problem in which every constraint in the problem has affine arguments that are expressed in the form A

  • invert( @@ -115,15 +117,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MatrixStuffing.html b/docs/reference/MatrixStuffing.html new file mode 100644 index 00000000..5d19b3c7 --- /dev/null +++ b/docs/reference/MatrixStuffing.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/MaxElemwise-class.html b/docs/reference/MaxElemwise-class.html index f4ffa0f9..bb568086 100644 --- a/docs/reference/MaxElemwise-class.html +++ b/docs/reference/MaxElemwise-class.html @@ -1,9 +1,9 @@ -The MaxElemwise class. — MaxElemwise-class • CVXRThe MaxElemwise class. — MaxElemwise-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,66 +68,68 @@

The MaxElemwise class.

MaxElemwise(arg1, arg2, ...)
 
-# S4 method for MaxElemwise
+# S4 method for class 'MaxElemwise'
 to_numeric(object, values)
 
-# S4 method for MaxElemwise
+# S4 method for class 'MaxElemwise'
 sign_from_args(object)
 
-# S4 method for MaxElemwise
+# S4 method for class 'MaxElemwise'
 is_atom_convex(object)
 
-# S4 method for MaxElemwise
+# S4 method for class 'MaxElemwise'
 is_atom_concave(object)
 
-# S4 method for MaxElemwise
+# S4 method for class 'MaxElemwise'
 is_atom_log_log_convex(object)
 
-# S4 method for MaxElemwise
+# S4 method for class 'MaxElemwise'
 is_atom_log_log_concave(object)
 
-# S4 method for MaxElemwise
+# S4 method for class 'MaxElemwise'
 is_incr(object, idx)
 
-# S4 method for MaxElemwise
+# S4 method for class 'MaxElemwise'
 is_decr(object, idx)
 
-# S4 method for MaxElemwise
+# S4 method for class 'MaxElemwise'
 is_pwl(object)
 
-# S4 method for MaxElemwise
+# S4 method for class 'MaxElemwise'
 .grad(object, values)

Arguments

-
arg1
+ + +
arg1

The first Expression in the maximum operation.

-
arg2
+
arg2

The second Expression in the maximum operation.

-
...
+
...

Additional Expression objects in the maximum operation.

-
object
+
object

A MaxElemwise object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(MaxElemwise): The elementwise maximum.

  • sign_from_args(MaxElemwise): The sign of the atom.

  • is_atom_convex(MaxElemwise): The atom is convex.

  • @@ -141,7 +143,7 @@

    Methods (by generic)

Slots

- +
arg1

The first Expression in the maximum operation.

@@ -169,15 +171,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MaxElemwise.html b/docs/reference/MaxElemwise.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/MaxElemwise.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/MaxEntries-class.html b/docs/reference/MaxEntries-class.html index 192a1e82..df9c3754 100644 --- a/docs/reference/MaxEntries-class.html +++ b/docs/reference/MaxEntries-class.html @@ -1,9 +1,9 @@ -The MaxEntries class. — MaxEntries-class • CVXRThe MaxEntries class. — MaxEntries-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,73 +68,75 @@

The MaxEntries class.

MaxEntries(x, axis = NA_real_, keepdims = FALSE)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 to_numeric(object, values)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 sign_from_args(object)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 is_atom_convex(object)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 is_atom_concave(object)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 is_atom_log_log_convex(object)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 is_atom_log_log_concave(object)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 is_incr(object, idx)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 is_decr(object, idx)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 is_pwl(object)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 .grad(object, values)
 
-# S4 method for MaxEntries
+# S4 method for class 'MaxEntries'
 .column_grad(object, value)

Arguments

-
x
+ + +
x

An Expression representing a vector or matrix.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
object
+
object

A MaxEntries object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

-
value
+
value

A numeric value

Methods (by generic)

- +
  • to_numeric(MaxEntries): The largest entry in x.

  • sign_from_args(MaxEntries): The sign of the atom.

  • is_atom_convex(MaxEntries): The atom is convex.

  • @@ -149,7 +151,7 @@

    Methods (by generic)

Slots

- +
x

An Expression representing a vector or matrix.

@@ -177,15 +179,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MaxEntries.html b/docs/reference/MaxEntries.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/MaxEntries.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Maximize-class.html b/docs/reference/Maximize-class.html index e4317f36..7f740e75 100644 --- a/docs/reference/Maximize-class.html +++ b/docs/reference/Maximize-class.html @@ -1,9 +1,9 @@ -The Maximize class. — Maximize-class • CVXRThe Maximize class. — Maximize-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,36 +68,38 @@

The Maximize class.

Maximize(expr)
 
-# S4 method for Maximize
+# S4 method for class 'Maximize'
 canonicalize(object)
 
-# S4 method for Maximize
+# S4 method for class 'Maximize'
 is_dcp(object)
 
-# S4 method for Maximize
+# S4 method for class 'Maximize'
 is_dgp(object)

Arguments

-
expr
+ + +
expr

A scalar Expression to maximize.

-
object
+
object

A Maximize object.

Methods (by generic)

- +
  • canonicalize(Maximize): Negates the target expression's objective.

  • is_dcp(Maximize): A logical value indicating whether the objective is concave.

  • is_dgp(Maximize): A logical value indicating whether the objective is log-log concave.

Slots

- +
expr

A scalar Expression to maximize.

@@ -134,15 +136,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Maximize.html b/docs/reference/Maximize.html new file mode 100644 index 00000000..24ee6b70 --- /dev/null +++ b/docs/reference/Maximize.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/MinElemwise-class.html b/docs/reference/MinElemwise-class.html index ed0cd258..76c56b5c 100644 --- a/docs/reference/MinElemwise-class.html +++ b/docs/reference/MinElemwise-class.html @@ -1,9 +1,9 @@ -The MinElemwise class. — MinElemwise-class • CVXRThe MinElemwise class. — MinElemwise-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,66 +68,68 @@

The MinElemwise class.

MinElemwise(arg1, arg2, ...)
 
-# S4 method for MinElemwise
+# S4 method for class 'MinElemwise'
 to_numeric(object, values)
 
-# S4 method for MinElemwise
+# S4 method for class 'MinElemwise'
 sign_from_args(object)
 
-# S4 method for MinElemwise
+# S4 method for class 'MinElemwise'
 is_atom_convex(object)
 
-# S4 method for MinElemwise
+# S4 method for class 'MinElemwise'
 is_atom_concave(object)
 
-# S4 method for MinElemwise
+# S4 method for class 'MinElemwise'
 is_atom_log_log_convex(object)
 
-# S4 method for MinElemwise
+# S4 method for class 'MinElemwise'
 is_atom_log_log_concave(object)
 
-# S4 method for MinElemwise
+# S4 method for class 'MinElemwise'
 is_incr(object, idx)
 
-# S4 method for MinElemwise
+# S4 method for class 'MinElemwise'
 is_decr(object, idx)
 
-# S4 method for MinElemwise
+# S4 method for class 'MinElemwise'
 is_pwl(object)
 
-# S4 method for MinElemwise
+# S4 method for class 'MinElemwise'
 .grad(object, values)

Arguments

-
arg1
+ + +
arg1

The first Expression in the minimum operation.

-
arg2
+
arg2

The second Expression in the minimum operation.

-
...
+
...

Additional Expression objects in the minimum operation.

-
object
+
object

A MinElemwise object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(MinElemwise): The elementwise minimum.

  • sign_from_args(MinElemwise): The sign of the atom.

  • is_atom_convex(MinElemwise): The atom is not convex.

  • @@ -141,7 +143,7 @@

    Methods (by generic)

Slots

- +
arg1

The first Expression in the minimum operation.

@@ -169,15 +171,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MinElemwise.html b/docs/reference/MinElemwise.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/MinElemwise.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/MinEntries-class.html b/docs/reference/MinEntries-class.html index 7d4482bb..2a466352 100644 --- a/docs/reference/MinEntries-class.html +++ b/docs/reference/MinEntries-class.html @@ -1,9 +1,9 @@ -The MinEntries class. — MinEntries-class • CVXRThe MinEntries class. — MinEntries-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,73 +68,75 @@

The MinEntries class.

MinEntries(x, axis = NA_real_, keepdims = FALSE)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 to_numeric(object, values)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 sign_from_args(object)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 is_atom_convex(object)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 is_atom_concave(object)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 is_atom_log_log_convex(object)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 is_atom_log_log_concave(object)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 is_incr(object, idx)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 is_decr(object, idx)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 is_pwl(object)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 .grad(object, values)
 
-# S4 method for MinEntries
+# S4 method for class 'MinEntries'
 .column_grad(object, value)

Arguments

-
x
+ + +
x

An Expression representing a vector or matrix.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
object
+
object

A MinEntries object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

-
value
+
value

A numeric value

Methods (by generic)

- +
  • to_numeric(MinEntries): The largest entry in x.

  • sign_from_args(MinEntries): The sign of the atom.

  • is_atom_convex(MinEntries): The atom is not convex.

  • @@ -149,7 +151,7 @@

    Methods (by generic)

Slots

- +
x

An Expression representing a vector or matrix.

@@ -177,15 +179,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MinEntries.html b/docs/reference/MinEntries.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/MinEntries.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Minimize-class.html b/docs/reference/Minimize-class.html index 301b3255..f0e18d5b 100644 --- a/docs/reference/Minimize-class.html +++ b/docs/reference/Minimize-class.html @@ -1,9 +1,9 @@ -The Minimize class. — Minimize-class • CVXRThe Minimize class. — Minimize-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,36 +68,38 @@

The Minimize class.

Minimize(expr)
 
-# S4 method for Minimize
+# S4 method for class 'Minimize'
 canonicalize(object)
 
-# S4 method for Minimize
+# S4 method for class 'Minimize'
 is_dcp(object)
 
-# S4 method for Minimize
+# S4 method for class 'Minimize'
 is_dgp(object)

Arguments

-
expr
+ + +
expr

A scalar Expression to minimize.

-
object
+
object

A Minimize object.

Methods (by generic)

- +
  • canonicalize(Minimize): Pass on the target expression's objective and constraints.

  • is_dcp(Minimize): A logical value indicating whether the objective is convex.

  • is_dgp(Minimize): A logical value indicating whether the objective is log-log convex.

Slots

- +
expr

A scalar Expression to minimize.

@@ -117,15 +119,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Minimize.html b/docs/reference/Minimize.html new file mode 100644 index 00000000..14d22bec --- /dev/null +++ b/docs/reference/Minimize.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/MixedNorm.html b/docs/reference/MixedNorm.html index 29ad13fd..9165861a 100644 --- a/docs/reference/MixedNorm.html +++ b/docs/reference/MixedNorm.html @@ -1,9 +1,9 @@ -The MixedNorm atom. — MixedNorm • CVXRThe MixedNorm atom. — MixedNorm • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

The MixedNorm atom.

Arguments

-
X
+ + +
X

The matrix to take the \(l_{p,q}\) norm of

-
p
+
p

The type of inner norm

-
q
+
q

The type of outer norm

Value

- - -

Returns the mixed norm of X with specified parameters p and q

+

Returns the mixed norm of X with specified parameters p and q

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MulExpression-class.html b/docs/reference/MulExpression-class.html index e74ed73f..073e7774 100644 --- a/docs/reference/MulExpression-class.html +++ b/docs/reference/MulExpression-class.html @@ -1,10 +1,10 @@ The MulExpression class. — %*%,Expression,Expression-method • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -68,79 +68,81 @@

The MulExpression class.

-
# S4 method for Expression,Expression
-%*%(x, y)
-
-# S4 method for Expression,ConstVal
-%*%(x, y)
-
-# S4 method for ConstVal,Expression
-%*%(x, y)
-
-# S4 method for MulExpression
-to_numeric(object, values)
-
-# S4 method for MulExpression
-dim_from_args(object)
-
-# S4 method for MulExpression
-is_atom_convex(object)
-
-# S4 method for MulExpression
-is_atom_concave(object)
-
-# S4 method for MulExpression
-is_atom_log_log_convex(object)
-
-# S4 method for MulExpression
-is_atom_log_log_concave(object)
-
-# S4 method for MulExpression
-is_incr(object, idx)
-
-# S4 method for MulExpression
-is_decr(object, idx)
-
-# S4 method for MulExpression
-.grad(object, values)
-
-# S4 method for MulExpression
-graph_implementation(object, arg_objs, dim, data = NA_real_)
+
# S4 method for class 'Expression,Expression'
+x %*% y
+
+# S4 method for class 'Expression,ConstVal'
+x %*% y
+
+# S4 method for class 'ConstVal,Expression'
+x %*% y
+
+# S4 method for class 'MulExpression'
+to_numeric(object, values)
+
+# S4 method for class 'MulExpression'
+dim_from_args(object)
+
+# S4 method for class 'MulExpression'
+is_atom_convex(object)
+
+# S4 method for class 'MulExpression'
+is_atom_concave(object)
+
+# S4 method for class 'MulExpression'
+is_atom_log_log_convex(object)
+
+# S4 method for class 'MulExpression'
+is_atom_log_log_concave(object)
+
+# S4 method for class 'MulExpression'
+is_incr(object, idx)
+
+# S4 method for class 'MulExpression'
+is_decr(object, idx)
+
+# S4 method for class 'MulExpression'
+.grad(object, values)
+
+# S4 method for class 'MulExpression'
+graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
x, y
+ + +
x, y

The Expression objects or numeric constants to multiply.

-
object
+
object

A MulExpression object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(MulExpression): Matrix multiplication.

  • dim_from_args(MulExpression): The (row, col) dimensions of the expression.

  • is_atom_convex(MulExpression): Multiplication is convex (affine) in its arguments only if one of the arguments is constant.

  • @@ -169,15 +171,15 @@

    See also

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/MulExpression.html b/docs/reference/MulExpression.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/MulExpression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Multiply-class.html b/docs/reference/Multiply-class.html index da99c7bd..3af4ca71 100644 --- a/docs/reference/Multiply-class.html +++ b/docs/reference/Multiply-class.html @@ -1,9 +1,9 @@ -The Multiply class. — Multiply-class • CVXRThe Multiply class. — Multiply-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,61 +68,63 @@

The Multiply class.

Multiply(lh_exp, rh_exp)
 
-# S4 method for Multiply
+# S4 method for class 'Multiply'
 to_numeric(object, values)
 
-# S4 method for Multiply
+# S4 method for class 'Multiply'
 dim_from_args(object)
 
-# S4 method for Multiply
+# S4 method for class 'Multiply'
 is_atom_log_log_convex(object)
 
-# S4 method for Multiply
+# S4 method for class 'Multiply'
 is_atom_log_log_concave(object)
 
-# S4 method for Multiply
+# S4 method for class 'Multiply'
 is_psd(object)
 
-# S4 method for Multiply
+# S4 method for class 'Multiply'
 is_nsd(object)
 
-# S4 method for Multiply
+# S4 method for class 'Multiply'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
lh_exp
+ + +
lh_exp

An Expression or R numeric data.

-
rh_exp
+
rh_exp

An Expression or R numeric data.

-
object
+
object

A Multiply object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(Multiply): Multiplies the values elementwise.

  • dim_from_args(Multiply): The sum of the argument dimensions - 1.

  • is_atom_log_log_convex(Multiply): Is the atom log-log convex?

  • @@ -144,15 +146,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Neg-int.html b/docs/reference/Neg-int.html index e8b2b8ad..ebb9256e 100644 --- a/docs/reference/Neg-int.html +++ b/docs/reference/Neg-int.html @@ -1,9 +1,9 @@ -An alias for -MinElemwise(x, 0) — Neg • CVXRAn alias for -MinElemwise(x, 0) — Neg • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

An alias for -MinElemwise(x, 0)

Arguments

-
x
+ + +
x

An R numeric value or Expression.

Value

- - -

An alias for -MinElemwise(x, 0)

+

An alias for -MinElemwise(x, 0)

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/NegExpression-class.html b/docs/reference/NegExpression-class.html index 4e3ab4c3..d1301fc6 100644 --- a/docs/reference/NegExpression-class.html +++ b/docs/reference/NegExpression-class.html @@ -1,9 +1,9 @@ -The NegExpression class. — -,Expression,missing-method • CVXRThe NegExpression class. — -,Expression,missing-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,69 +66,71 @@

The NegExpression class.

-
# S4 method for Expression,missing
--(e1, e2)
-
-# S4 method for Expression,Expression
--(e1, e2)
-
-# S4 method for Expression,ConstVal
--(e1, e2)
-
-# S4 method for ConstVal,Expression
--(e1, e2)
-
-# S4 method for NegExpression
-dim_from_args(object)
-
-# S4 method for NegExpression
-sign_from_args(object)
-
-# S4 method for NegExpression
-is_incr(object, idx)
-
-# S4 method for NegExpression
-is_decr(object, idx)
-
-# S4 method for NegExpression
-is_symmetric(object)
-
-# S4 method for NegExpression
-is_hermitian(object)
-
-# S4 method for NegExpression
-graph_implementation(object, arg_objs, dim, data = NA_real_)
+
# S4 method for class 'Expression,missing'
+e1 - e2
+
+# S4 method for class 'Expression,Expression'
+e1 - e2
+
+# S4 method for class 'Expression,ConstVal'
+e1 - e2
+
+# S4 method for class 'ConstVal,Expression'
+e1 - e2
+
+# S4 method for class 'NegExpression'
+dim_from_args(object)
+
+# S4 method for class 'NegExpression'
+sign_from_args(object)
+
+# S4 method for class 'NegExpression'
+is_incr(object, idx)
+
+# S4 method for class 'NegExpression'
+is_decr(object, idx)
+
+# S4 method for class 'NegExpression'
+is_symmetric(object)
+
+# S4 method for class 'NegExpression'
+is_hermitian(object)
+
+# S4 method for class 'NegExpression'
+graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
e1, e2
+ + +
e1, e2

The Expression objects or numeric constants to subtract.

-
object
+
object

A NegExpression object.

-
idx
+
idx

An index into the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • dim_from_args(NegExpression): The (row, col) dimensions of the expression.

  • sign_from_args(NegExpression): The (is positive, is negative) sign of the expression.

  • is_incr(NegExpression): The expression is not weakly increasing in any argument.

  • @@ -150,15 +152,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/NegExpression.html b/docs/reference/NegExpression.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/NegExpression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/NonPosConstraint-class.html b/docs/reference/NonPosConstraint-class.html index e276b1c7..e4480e5a 100644 --- a/docs/reference/NonPosConstraint-class.html +++ b/docs/reference/NonPosConstraint-class.html @@ -1,9 +1,9 @@ -The NonPosConstraint class — NonPosConstraint-class • CVXRThe NonPosConstraint class — NonPosConstraint-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,31 +66,33 @@

The NonPosConstraint class

-
# S4 method for NonPosConstraint
+    
# S4 method for class 'NonPosConstraint'
 name(x)
 
-# S4 method for NonPosConstraint
+# S4 method for class 'NonPosConstraint'
 is_dcp(object)
 
-# S4 method for NonPosConstraint
+# S4 method for class 'NonPosConstraint'
 is_dgp(object)
 
-# S4 method for NonPosConstraint
+# S4 method for class 'NonPosConstraint'
 canonicalize(object)
 
-# S4 method for NonPosConstraint
+# S4 method for class 'NonPosConstraint'
 residual(object)

Arguments

-
x, object
+ + +
x, object

A NonPosConstraint object.

Methods (by generic)

- +
  • name(NonPosConstraint): The string representation of the constraint.

  • is_dcp(NonPosConstraint): Is the constraint DCP?

  • is_dgp(NonPosConstraint): Is the constraint DGP?

  • @@ -110,15 +112,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/NonlinearConstraint-class.html b/docs/reference/NonlinearConstraint-class.html index 734ef0f7..f78546c8 100644 --- a/docs/reference/NonlinearConstraint-class.html +++ b/docs/reference/NonlinearConstraint-class.html @@ -1,9 +1,9 @@ -The NonlinearConstraint class. — NonlinearConstraint-class • CVXRThe NonlinearConstraint class. — NonlinearConstraint-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,21 +71,23 @@

The NonlinearConstraint class.

Arguments

-
f
+ + +
f

A nonlinear function.

-
vars_
+
vars_

A list of variables involved in the function.

-
id
+
id

(Optional) An integer representing the unique ID of the contraint.

Slots

- +
f

A nonlinear function.

@@ -113,15 +115,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/NonlinearConstraint.html b/docs/reference/NonlinearConstraint.html new file mode 100644 index 00000000..1b5719f4 --- /dev/null +++ b/docs/reference/NonlinearConstraint.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Norm-atom.html b/docs/reference/Norm-atom.html index 58c887b2..d8b82824 100644 --- a/docs/reference/Norm-atom.html +++ b/docs/reference/Norm-atom.html @@ -1,9 +1,9 @@ -The Norm atom. — Norm • CVXRThe Norm atom. — Norm • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,28 +71,28 @@

The Norm atom.

Arguments

-
x
+ + +
x

The matrix to take the norm of

-
p
+
p

The type of norm. Valid options include any positive integer, 'fro' (for frobenius), 'nuc' (sum of singular values), np.inf or 'inf' (infinity norm).

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

Value

- - -

Returns the specified norm of x.

+

Returns the specified norm of x.

@@ -107,15 +107,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Norm1-class.html b/docs/reference/Norm1-class.html index 12b8d102..3e9df3d1 100644 --- a/docs/reference/Norm1-class.html +++ b/docs/reference/Norm1-class.html @@ -1,9 +1,9 @@ -The Norm1 class. — Norm1-class • CVXRThe Norm1 class. — Norm1-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,79 +68,81 @@

The Norm1 class.

Norm1(x, axis = NA_real_, keepdims = FALSE)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 name(x)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 to_numeric(object, values)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 allow_complex(object)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 sign_from_args(object)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 is_atom_convex(object)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 is_atom_concave(object)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 is_incr(object, idx)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 is_decr(object, idx)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 is_pwl(object)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 get_data(object)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 .domain(object)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 .grad(object, values)
 
-# S4 method for Norm1
+# S4 method for class 'Norm1'
 .column_grad(object, value)

Arguments

-
x
+ + +
x

An Expression object.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
object
+
object

A Norm1 object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

-
value
+
value

A numeric value

Methods (by generic)

- +
  • name(Norm1): The name and arguments of the atom.

  • to_numeric(Norm1): Returns the 1-norm of x along the given axis.

  • allow_complex(Norm1): Does the atom handle complex numbers?

  • @@ -157,7 +159,7 @@

    Methods (by generic)

Slots

- +
x

An Expression object.

@@ -177,15 +179,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Norm2-atom.html b/docs/reference/Norm2-atom.html index e0076903..9aeab17a 100644 --- a/docs/reference/Norm2-atom.html +++ b/docs/reference/Norm2-atom.html @@ -1,9 +1,9 @@ -The Norm2 atom. — Norm2 • CVXRThe Norm2 atom. — Norm2 • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

The Norm2 atom.

Arguments

-
x
+ + +
x

An Expression object.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

Value

- - -

Returns the 2-norm of x.

+

Returns the 2-norm of x.

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/NormInf-class.html b/docs/reference/NormInf-class.html index 7ef8d488..fc987332 100644 --- a/docs/reference/NormInf-class.html +++ b/docs/reference/NormInf-class.html @@ -1,9 +1,9 @@ -The NormInf class. — NormInf-class • CVXRThe NormInf class. — NormInf-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,73 +66,75 @@

The NormInf class.

-
# S4 method for NormInf
+    
# S4 method for class 'NormInf'
 name(x)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 to_numeric(object, values)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 allow_complex(object)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 sign_from_args(object)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 is_atom_convex(object)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 is_atom_concave(object)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 is_atom_log_log_convex(object)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 is_atom_log_log_concave(object)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 is_incr(object, idx)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 is_decr(object, idx)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 is_pwl(object)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 get_data(object)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 .domain(object)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 .grad(object, values)
 
-# S4 method for NormInf
+# S4 method for class 'NormInf'
 .column_grad(object, value)

Arguments

-
x, object
+ + +
x, object

A NormInf object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

-
value
+
value

A numeric value

Methods (by generic)

- +
  • name(NormInf): The name and arguments of the atom.

  • to_numeric(NormInf): Returns the infinity norm of x.

  • allow_complex(NormInf): Does the atom handle complex numbers?

  • @@ -162,15 +164,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/NormInf.html b/docs/reference/NormInf.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/NormInf.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/NormNuc-class.html b/docs/reference/NormNuc-class.html index 53a0e63f..fb083b4e 100644 --- a/docs/reference/NormNuc-class.html +++ b/docs/reference/NormNuc-class.html @@ -1,9 +1,9 @@ -The NormNuc class. — NormNuc-class • CVXRThe NormNuc class. — NormNuc-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,55 +68,57 @@

The NormNuc class.

NormNuc(A)
 
-# S4 method for NormNuc
+# S4 method for class 'NormNuc'
 to_numeric(object, values)
 
-# S4 method for NormNuc
+# S4 method for class 'NormNuc'
 allow_complex(object)
 
-# S4 method for NormNuc
+# S4 method for class 'NormNuc'
 dim_from_args(object)
 
-# S4 method for NormNuc
+# S4 method for class 'NormNuc'
 sign_from_args(object)
 
-# S4 method for NormNuc
+# S4 method for class 'NormNuc'
 is_atom_convex(object)
 
-# S4 method for NormNuc
+# S4 method for class 'NormNuc'
 is_atom_concave(object)
 
-# S4 method for NormNuc
+# S4 method for class 'NormNuc'
 is_incr(object, idx)
 
-# S4 method for NormNuc
+# S4 method for class 'NormNuc'
 is_decr(object, idx)
 
-# S4 method for NormNuc
+# S4 method for class 'NormNuc'
 .grad(object, values)

Arguments

-
A
+ + +
A

An Expression or numeric matrix.

-
object
+
object

A NormNuc object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(NormNuc): The nuclear norm (i.e., the sum of the singular values) of A.

  • allow_complex(NormNuc): Does the atom handle complex numbers?

  • dim_from_args(NormNuc): The atom is a scalar.

  • @@ -129,7 +131,7 @@

    Methods (by generic)

Slots

- +
A

An Expression or numeric matrix.

@@ -149,15 +151,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/NormNuc.html b/docs/reference/NormNuc.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/NormNuc.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/OSQP-class.html b/docs/reference/OSQP-class.html index f4985d0e..7392815d 100644 --- a/docs/reference/OSQP-class.html +++ b/docs/reference/OSQP-class.html @@ -1,9 +1,9 @@ -An interface for the OSQP solver. — OSQP-class • CVXRAn interface for the OSQP solver. — OSQP-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,19 +68,19 @@

An interface for the OSQP solver.

OSQP()
 
-# S4 method for OSQP
+# S4 method for class 'OSQP'
 status_map(solver, status)
 
-# S4 method for OSQP
+# S4 method for class 'OSQP'
 name(x)
 
-# S4 method for OSQP
+# S4 method for class 'OSQP'
 import_solver(solver)
 
-# S4 method for OSQP,list,InverseData
+# S4 method for class 'OSQP,list,InverseData'
 invert(object, solution, inverse_data)
 
-# S4 method for OSQP
+# S4 method for class 'OSQP'
 solve_via_data(
   object,
   data,
@@ -97,61 +97,63 @@ 

An interface for the OSQP solver.

Arguments

-
solver, object, x
+ + +
solver, object, x

A OSQP object.

-
status
+
status

A status code returned by the solver.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A InverseData object containing data necessary for the inversion.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance.

-
reltol
+
reltol

The relative tolerance.

-
abstol
+
abstol

The absolute tolerance.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • status_map(OSQP): Converts status returned by the OSQP solver to its respective CVXPY status.

  • name(OSQP): Returns the name of the solver.

  • import_solver(OSQP): Imports the solver.

  • @@ -171,15 +173,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/OSQP.html b/docs/reference/OSQP.html new file mode 100644 index 00000000..898d17aa --- /dev/null +++ b/docs/reference/OSQP.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Objective-arith.html b/docs/reference/Objective-arith.html index 97fdec7d..2bbf30a4 100644 --- a/docs/reference/Objective-arith.html +++ b/docs/reference/Objective-arith.html @@ -1,9 +1,9 @@ -Arithmetic Operations on Objectives — Objective-arith • CVXRArithmetic Operations on Objectives — Objective-arith • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,79 +66,79 @@

Arithmetic Operations on Objectives

-
# S4 method for Objective,numeric
-+(e1, e2)
-
-# S4 method for numeric,Objective
-+(e1, e2)
-
-# S4 method for Minimize,missing
--(e1, e2)
-
-# S4 method for Minimize,Minimize
-+(e1, e2)
-
-# S4 method for Minimize,Maximize
-+(e1, e2)
-
-# S4 method for Objective,Minimize
--(e1, e2)
-
-# S4 method for Objective,Maximize
--(e1, e2)
-
-# S4 method for Minimize,Objective
--(e1, e2)
-
-# S4 method for Maximize,Objective
--(e1, e2)
-
-# S4 method for Objective,numeric
--(e1, e2)
-
-# S4 method for numeric,Objective
--(e1, e2)
-
-# S4 method for Minimize,numeric
-*(e1, e2)
-
-# S4 method for Maximize,numeric
-*(e1, e2)
-
-# S4 method for numeric,Minimize
-*(e1, e2)
-
-# S4 method for numeric,Maximize
-*(e1, e2)
-
-# S4 method for Objective,numeric
-/(e1, e2)
-
-# S4 method for Maximize,missing
--(e1, e2)
-
-# S4 method for Maximize,Maximize
-+(e1, e2)
-
-# S4 method for Maximize,Minimize
-+(e1, e2)
+
# S4 method for class 'Objective,numeric'
+e1 + e2
+
+# S4 method for class 'numeric,Objective'
+e1 + e2
+
+# S4 method for class 'Minimize,missing'
+e1 - e2
+
+# S4 method for class 'Minimize,Minimize'
+e1 + e2
+
+# S4 method for class 'Minimize,Maximize'
+e1 + e2
+
+# S4 method for class 'Objective,Minimize'
+e1 - e2
+
+# S4 method for class 'Objective,Maximize'
+e1 - e2
+
+# S4 method for class 'Minimize,Objective'
+e1 - e2
+
+# S4 method for class 'Maximize,Objective'
+e1 - e2
+
+# S4 method for class 'Objective,numeric'
+e1 - e2
+
+# S4 method for class 'numeric,Objective'
+e1 - e2
+
+# S4 method for class 'Minimize,numeric'
+e1 * e2
+
+# S4 method for class 'Maximize,numeric'
+e1 * e2
+
+# S4 method for class 'numeric,Minimize'
+e1 * e2
+
+# S4 method for class 'numeric,Maximize'
+e1 * e2
+
+# S4 method for class 'Objective,numeric'
+e1/e2
+
+# S4 method for class 'Maximize,missing'
+e1 - e2
+
+# S4 method for class 'Maximize,Maximize'
+e1 + e2
+
+# S4 method for class 'Maximize,Minimize'
+e1 + e2

Arguments

-
e1
+ + +
e1

The left-hand Minimize, Maximize, or numeric value.

-
e2
+
e2

The right-hand Minimize, Maximize, or numeric value.

Value

- - -

A Minimize or Maximize object.

+

A Minimize or Maximize object.

@@ -153,15 +153,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Objective-class.html b/docs/reference/Objective-class.html index 39a424d7..0c2551d8 100644 --- a/docs/reference/Objective-class.html +++ b/docs/reference/Objective-class.html @@ -1,9 +1,9 @@ -The Objective class. — Objective-class • CVXRThe Objective class. — Objective-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,36 +68,38 @@

The Objective class.

Objective(expr)
 
-# S4 method for Objective
+# S4 method for class 'Objective'
 value(object)
 
-# S4 method for Objective
+# S4 method for class 'Objective'
 is_quadratic(object)
 
-# S4 method for Objective
+# S4 method for class 'Objective'
 is_qpwa(object)

Arguments

-
expr
+ + +
expr

A scalar Expression to optimize.

-
object
+
object

An Objective object.

Methods (by generic)

- +
  • value(Objective): The value of the objective expression.

  • is_quadratic(Objective): Is the objective a quadratic function?

  • is_qpwa(Objective): Is the objective a quadratic of piecewise affine function?

Slots

- +
expr

A scalar Expression to optimize.

@@ -117,15 +119,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/OneMinusPos-class.html b/docs/reference/OneMinusPos-class.html index 5d42846b..5662ecb6 100644 --- a/docs/reference/OneMinusPos-class.html +++ b/docs/reference/OneMinusPos-class.html @@ -1,9 +1,9 @@ -The OneMinusPos class. — OneMinusPos-class • CVXRThe OneMinusPos class. — OneMinusPos-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,61 +68,63 @@

The OneMinusPos class.

OneMinusPos(x)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 name(x)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 to_numeric(object, values)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 dim_from_args(object)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 sign_from_args(object)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 is_atom_convex(object)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 is_atom_concave(object)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 is_atom_log_log_convex(object)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 is_atom_log_log_concave(object)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 is_incr(object, idx)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 is_decr(object, idx)
 
-# S4 method for OneMinusPos
+# S4 method for class 'OneMinusPos'
 .grad(object, values)

Arguments

-
x
+ + +
x

An Expression or numeric matrix.

-
object
+
object

A OneMinusPos object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • name(OneMinusPos): The name and arguments of the atom.

  • to_numeric(OneMinusPos): Returns one minus the value.

  • dim_from_args(OneMinusPos): The dimensions of the atom.

  • @@ -137,7 +139,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric matrix.

@@ -157,15 +159,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/OneMinusPos.html b/docs/reference/OneMinusPos.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/OneMinusPos.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/PSDConstraint-class.html b/docs/reference/PSDConstraint-class.html index ea01c2c4..7abffee8 100644 --- a/docs/reference/PSDConstraint-class.html +++ b/docs/reference/PSDConstraint-class.html @@ -1,9 +1,9 @@ -The PSDConstraint class. — %>>% • CVXRThe PSDConstraint class. — %>>% • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,67 +66,69 @@

The PSDConstraint class.

-
e1 %>>% e2
-
-e1 %<<% e2
-
-# S4 method for Expression,Expression
-%&gt;&gt;%(e1, e2)
-
-# S4 method for Expression,ConstVal
-%&gt;&gt;%(e1, e2)
-
-# S4 method for ConstVal,Expression
-%&gt;&gt;%(e1, e2)
-
-# S4 method for Expression,Expression
-%&lt;&lt;%(e1, e2)
-
-# S4 method for Expression,ConstVal
-%&lt;&lt;%(e1, e2)
-
-# S4 method for ConstVal,Expression
-%&lt;&lt;%(e1, e2)
-
-PSDConstraint(expr, id = NA_integer_)
-
-# S4 method for PSDConstraint
-name(x)
-
-# S4 method for PSDConstraint
-is_dcp(object)
-
-# S4 method for PSDConstraint
-is_dgp(object)
-
-# S4 method for PSDConstraint
-residual(object)
-
-# S4 method for PSDConstraint
-canonicalize(object)
+
e1 %>>% e2
+
+e1 %<<% e2
+
+# S4 method for class 'Expression,Expression'
+e1 %>>% e2
+
+# S4 method for class 'Expression,ConstVal'
+e1 %>>% e2
+
+# S4 method for class 'ConstVal,Expression'
+e1 %>>% e2
+
+# S4 method for class 'Expression,Expression'
+e1 %<<% e2
+
+# S4 method for class 'Expression,ConstVal'
+e1 %<<% e2
+
+# S4 method for class 'ConstVal,Expression'
+e1 %<<% e2
+
+PSDConstraint(expr, id = NA_integer_)
+
+# S4 method for class 'PSDConstraint'
+name(x)
+
+# S4 method for class 'PSDConstraint'
+is_dcp(object)
+
+# S4 method for class 'PSDConstraint'
+is_dgp(object)
+
+# S4 method for class 'PSDConstraint'
+residual(object)
+
+# S4 method for class 'PSDConstraint'
+canonicalize(object)

Arguments

-
e1, e2
+ + +
e1, e2

The Expression objects or numeric constants to compare.

-
expr
+
expr

An Expression, numeric element, vector, or matrix representing \(X\).

-
id
+
id

(Optional) A numeric value representing the constraint ID.

-
x, object
+
x, object

A PSDConstraint object.

Methods (by generic)

- +
  • name(PSDConstraint): The string representation of the constraint.

  • is_dcp(PSDConstraint): The constraint is DCP if the left-hand and right-hand expressions are affine.

  • is_dgp(PSDConstraint): Is the constraint DGP?

  • @@ -135,7 +137,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression, numeric element, vector, or matrix representing \(X\).

@@ -155,15 +157,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/PSDConstraint.html b/docs/reference/PSDConstraint.html new file mode 100644 index 00000000..0f746d96 --- /dev/null +++ b/docs/reference/PSDConstraint.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/PSDWrap-class.html b/docs/reference/PSDWrap-class.html index a44d0a91..0a81b2ec 100644 --- a/docs/reference/PSDWrap-class.html +++ b/docs/reference/PSDWrap-class.html @@ -1,9 +1,9 @@ -The PSDWrap class. — PSDWrap-class • CVXRThe PSDWrap class. — PSDWrap-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,23 +68,25 @@

The PSDWrap class.

PSDWrap(arg)
 
-# S4 method for PSDWrap
+# S4 method for class 'PSDWrap'
 is_psd(object)

Arguments

-
arg
+ + +
arg

A Expression object or matrix.

-
object
+
object

A PSDWrap object.

Methods (by generic)

- +
  • is_psd(PSDWrap): Is the atom positive semidefinite?

@@ -100,15 +102,15 @@

Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/PSDWrap.html b/docs/reference/PSDWrap.html new file mode 100644 index 00000000..88230429 --- /dev/null +++ b/docs/reference/PSDWrap.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Parameter-class.html b/docs/reference/Parameter-class.html index a3d4bc20..62a9bebc 100644 --- a/docs/reference/Parameter-class.html +++ b/docs/reference/Parameter-class.html @@ -1,9 +1,9 @@ -The Parameter class. — Parameter-class • CVXRThe Parameter class. — Parameter-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -74,57 +74,59 @@

The Parameter class.

... ) -# S4 method for Parameter +# S4 method for class 'Parameter' get_data(object) -# S4 method for Parameter +# S4 method for class 'Parameter' name(x) -# S4 method for Parameter +# S4 method for class 'Parameter' value(object) -# S4 method for Parameter +# S4 method for class 'Parameter' value(object) <- value -# S4 method for Parameter +# S4 method for class 'Parameter' grad(object) -# S4 method for Parameter +# S4 method for class 'Parameter' parameters(object) -# S4 method for Parameter +# S4 method for class 'Parameter' canonicalize(object)

Arguments

-
rows
+ + +
rows

The number of rows in the parameter.

-
cols
+
cols

The number of columns in the parameter.

-
name
+
name

(Optional) A character string representing the name of the parameter.

-
value
+
value

(Optional) A numeric element, vector, matrix, or data.frame. Defaults to NA and may be changed with value<- later.

-
...
+
...

Additional attribute arguments. See Leaf for details.

-
object, x
+
object, x

A Parameter object.

Methods (by generic)

- +
  • get_data(Parameter): Returns list(dim, name, value, attributes).

  • name(Parameter): The name of the parameter.

  • value(Parameter): The value of the parameter.

  • @@ -135,7 +137,7 @@

    Methods (by generic)

Slots

- +
rows

The number of rows in the parameter.

@@ -178,15 +180,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Parameter.html b/docs/reference/Parameter.html new file mode 100644 index 00000000..2f7668bf --- /dev/null +++ b/docs/reference/Parameter.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/PfEigenvalue-class.html b/docs/reference/PfEigenvalue-class.html index 3c4e11f9..cbbfd197 100644 --- a/docs/reference/PfEigenvalue-class.html +++ b/docs/reference/PfEigenvalue-class.html @@ -1,9 +1,9 @@ -The PfEigenvalue class. — PfEigenvalue-class • CVXRThe PfEigenvalue class. — PfEigenvalue-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,61 +68,63 @@

The PfEigenvalue class.

PfEigenvalue(X)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 name(x)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 to_numeric(object, values)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 dim_from_args(object)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 sign_from_args(object)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 is_atom_convex(object)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 is_atom_concave(object)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 is_atom_log_log_convex(object)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 is_atom_log_log_concave(object)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 is_incr(object, idx)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 is_decr(object, idx)
 
-# S4 method for PfEigenvalue
+# S4 method for class 'PfEigenvalue'
 .grad(object, values)

Arguments

-
X
+ + +
X

An Expression or numeric matrix.

-
x, object
+
x, object

A PfEigenvalue object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • name(PfEigenvalue): The name and arguments of the atom.

  • to_numeric(PfEigenvalue): Returns the Perron-Frobenius eigenvalue of X.

  • dim_from_args(PfEigenvalue): The dimensions of the atom.

  • @@ -137,7 +139,7 @@

    Methods (by generic)

Slots

- +
X

An Expression or numeric matrix.

@@ -157,15 +159,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/PfEigenvalue.html b/docs/reference/PfEigenvalue.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/PfEigenvalue.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Pnorm-class.html b/docs/reference/Pnorm-class.html index 9fc8b493..a0d8bd11 100644 --- a/docs/reference/Pnorm-class.html +++ b/docs/reference/Pnorm-class.html @@ -1,9 +1,9 @@ -The Pnorm class. — Pnorm-class • CVXRThe Pnorm class. — Pnorm-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,90 +68,92 @@

The Pnorm class.

Pnorm(x, p = 2, axis = NA_real_, keepdims = FALSE, max_denom = 1024)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 allow_complex(object)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 to_numeric(object, values)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 validate_args(object)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 sign_from_args(object)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 is_atom_convex(object)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 is_atom_concave(object)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 is_atom_log_log_convex(object)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 is_atom_log_log_concave(object)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 is_incr(object, idx)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 is_decr(object, idx)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 is_pwl(object)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 get_data(object)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 name(x)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 .domain(object)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 .grad(object, values)
 
-# S4 method for Pnorm
+# S4 method for class 'Pnorm'
 .column_grad(object, value)

Arguments

-
x
+ + +
x

An Expression representing a vector or matrix.

-
p
+
p

A number greater than or equal to 1, or equal to positive infinity.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
max_denom
+
max_denom

(Optional) The maximum denominator considered in forming a rational approximation for \(p\). The default is 1024.

-
object
+
object

A Pnorm object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

-
value
+
value

A numeric value

@@ -166,7 +168,7 @@

Details

Methods (by generic)

- +
  • allow_complex(Pnorm): Does the atom handle complex numbers?

  • to_numeric(Pnorm): The p-norm of x.

  • validate_args(Pnorm): Check that the arguments are valid.

  • @@ -186,7 +188,7 @@

    Methods (by generic)

Slots

- +
x

An Expression representing a vector or matrix.

@@ -230,15 +232,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Pnorm.html b/docs/reference/Pnorm.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/Pnorm.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Pos-int.html b/docs/reference/Pos-int.html index 2a64ac0d..294bb4b1 100644 --- a/docs/reference/Pos-int.html +++ b/docs/reference/Pos-int.html @@ -1,9 +1,9 @@ -An alias for MaxElemwise(x, 0) — Pos • CVXRAn alias for MaxElemwise(x, 0) — Pos • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

An alias for MaxElemwise(x, 0)

Arguments

-
x
+ + +
x

An R numeric value or Expression.

Value

- - -

An alias for MaxElemwise(x, 0)

+

An alias for MaxElemwise(x, 0)

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Power-class.html b/docs/reference/Power-class.html index 48281d3b..cb4bdcb2 100644 --- a/docs/reference/Power-class.html +++ b/docs/reference/Power-class.html @@ -1,10 +1,10 @@ The Power class. — Power-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -70,86 +70,88 @@

The Power class.

Power(x, p, max_denom = 1024)
 
-# S4 method for Power
+# S4 method for class 'Power'
 to_numeric(object, values)
 
-# S4 method for Power
+# S4 method for class 'Power'
 sign_from_args(object)
 
-# S4 method for Power
+# S4 method for class 'Power'
 is_atom_convex(object)
 
-# S4 method for Power
+# S4 method for class 'Power'
 is_atom_concave(object)
 
-# S4 method for Power
+# S4 method for class 'Power'
 is_atom_log_log_convex(object)
 
-# S4 method for Power
+# S4 method for class 'Power'
 is_atom_log_log_concave(object)
 
-# S4 method for Power
+# S4 method for class 'Power'
 is_constant(object)
 
-# S4 method for Power
+# S4 method for class 'Power'
 is_incr(object, idx)
 
-# S4 method for Power
+# S4 method for class 'Power'
 is_decr(object, idx)
 
-# S4 method for Power
+# S4 method for class 'Power'
 is_quadratic(object)
 
-# S4 method for Power
+# S4 method for class 'Power'
 is_qpwa(object)
 
-# S4 method for Power
+# S4 method for class 'Power'
 .grad(object, values)
 
-# S4 method for Power
+# S4 method for class 'Power'
 .domain(object)
 
-# S4 method for Power
+# S4 method for class 'Power'
 get_data(object)
 
-# S4 method for Power
+# S4 method for class 'Power'
 copy(object, args = NULL, id_objects = list())
 
-# S4 method for Power
+# S4 method for class 'Power'
 name(x)

Arguments

-
x
+ + +
x

The Expression to be raised to a power.

-
p
+
p

A numeric value indicating the scalar power.

-
max_denom
+
max_denom

The maximum denominator considered in forming a rational approximation of p.

-
object
+
object

A Power object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

-
args
+
args

A list of arguments to reconstruct the atom. If args=NULL, use the current args of the atom

-
id_objects
+
id_objects

Currently unused.

@@ -185,7 +187,7 @@

Details

Methods (by generic)

- +
  • to_numeric(Power): Throw an error if the power is negative and cannot be handled.

  • sign_from_args(Power): The sign of the atom.

  • is_atom_convex(Power): Is \(p \leq 0\) or \(p \geq 1\)?

  • @@ -205,7 +207,7 @@

    Methods (by generic)

Slots

- +
x

The Expression to be raised to a power.

@@ -233,15 +235,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Problem-arith.html b/docs/reference/Problem-arith.html index fab67560..3aa87fb1 100644 --- a/docs/reference/Problem-arith.html +++ b/docs/reference/Problem-arith.html @@ -1,9 +1,9 @@ -Arithmetic Operations on Problems — Problem-arith • CVXRArithmetic Operations on Problems — Problem-arith • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,55 +66,55 @@

Arithmetic Operations on Problems

-
# S4 method for Problem,missing
-+(e1, e2)
-
-# S4 method for Problem,missing
--(e1, e2)
-
-# S4 method for Problem,numeric
-+(e1, e2)
-
-# S4 method for numeric,Problem
-+(e1, e2)
-
-# S4 method for Problem,Problem
-+(e1, e2)
-
-# S4 method for Problem,numeric
--(e1, e2)
-
-# S4 method for numeric,Problem
--(e1, e2)
-
-# S4 method for Problem,Problem
--(e1, e2)
-
-# S4 method for Problem,numeric
-*(e1, e2)
-
-# S4 method for numeric,Problem
-*(e1, e2)
-
-# S4 method for Problem,numeric
-/(e1, e2)
+
# S4 method for class 'Problem,missing'
+e1 + e2
+
+# S4 method for class 'Problem,missing'
+e1 - e2
+
+# S4 method for class 'Problem,numeric'
+e1 + e2
+
+# S4 method for class 'numeric,Problem'
+e1 + e2
+
+# S4 method for class 'Problem,Problem'
+e1 + e2
+
+# S4 method for class 'Problem,numeric'
+e1 - e2
+
+# S4 method for class 'numeric,Problem'
+e1 - e2
+
+# S4 method for class 'Problem,Problem'
+e1 - e2
+
+# S4 method for class 'Problem,numeric'
+e1 * e2
+
+# S4 method for class 'numeric,Problem'
+e1 * e2
+
+# S4 method for class 'Problem,numeric'
+e1/e2

Arguments

-
e1
+ + +
e1

The left-hand Problem object.

-
e2
+
e2

The right-hand Problem object.

Value

- - -

A Problem object.

+

A Problem object.

@@ -129,15 +129,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Problem-class.html b/docs/reference/Problem-class.html index 1fc2fbcb..75e5050e 100644 --- a/docs/reference/Problem-class.html +++ b/docs/reference/Problem-class.html @@ -1,9 +1,9 @@ -The Problem class. — Problem-class • CVXRThe Problem class. — Problem-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,114 +68,116 @@

The Problem class.

Problem(objective, constraints = list())
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 objective(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 objective(object) <- value
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 constraints(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 constraints(object) <- value
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 value(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 value(object) <- value
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 status(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 is_dcp(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 is_dgp(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 is_qp(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 canonicalize(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 is_mixed_integer(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 variables(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 parameters(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 constants(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 atoms(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 size_metrics(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 solver_stats(object)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 solver_stats(object) <- value
 
-# S4 method for Problem,character,logical
+# S4 method for class 'Problem,character,logical'
 get_problem_data(object, solver, gp)
 
-# S4 method for Problem,character,missing
+# S4 method for class 'Problem,character,missing'
 get_problem_data(object, solver, gp)
 
-# S4 method for Problem
+# S4 method for class 'Problem'
 unpack_results(object, solution, chain, inverse_data)

Arguments

-
objective
+ + +
objective

A Minimize or Maximize object representing the optimization objective.

-
constraints
+
constraints

(Optional) A list of Constraint objects representing constraints on the optimization variables.

-
object
+
object

A Problem class.

-
value
+
value

A Minimize or Maximize object (objective), list of Constraint objects (constraints), or numeric scalar (value).

-
solver
+
solver

A string indicating the solver that the problem data is for. Call installed_solvers() to see all available.

-
gp
+
gp

Is the problem a geometric problem?

-
solution
+
solution

A Solution object.

-
chain
+
chain

The corresponding solving Chain.

-
inverse_data
+
inverse_data

A InverseData object or list containing data necessary for the inversion.

Methods (by generic)

- +
  • objective(Problem): The objective of the problem.

  • objective(Problem) <- value: Set the value of the problem objective.

  • constraints(Problem): A list of the constraints of the problem.

  • @@ -203,7 +205,7 @@

    Methods (by generic)

Slots

- +
objective

A Minimize or Maximize object representing the optimization objective.

@@ -264,15 +266,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Problem.html b/docs/reference/Problem.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/Problem.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/ProdEntries-class.html b/docs/reference/ProdEntries-class.html index 6d1a6fe3..72d12ccf 100644 --- a/docs/reference/ProdEntries-class.html +++ b/docs/reference/ProdEntries-class.html @@ -1,9 +1,9 @@ -The ProdEntries class. — ProdEntries-class • CVXRThe ProdEntries class. — ProdEntries-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,70 +68,72 @@

The ProdEntries class.

ProdEntries(..., axis = NA_real_, keepdims = FALSE)
 
-# S4 method for ProdEntries
+# S4 method for class 'ProdEntries'
 to_numeric(object, values)
 
-# S4 method for ProdEntries
+# S4 method for class 'ProdEntries'
 sign_from_args(object)
 
-# S4 method for ProdEntries
+# S4 method for class 'ProdEntries'
 is_atom_convex(object)
 
-# S4 method for ProdEntries
+# S4 method for class 'ProdEntries'
 is_atom_concave(object)
 
-# S4 method for ProdEntries
+# S4 method for class 'ProdEntries'
 is_atom_log_log_convex(object)
 
-# S4 method for ProdEntries
+# S4 method for class 'ProdEntries'
 is_atom_log_log_concave(object)
 
-# S4 method for ProdEntries
+# S4 method for class 'ProdEntries'
 is_incr(object, idx)
 
-# S4 method for ProdEntries
+# S4 method for class 'ProdEntries'
 is_decr(object, idx)
 
-# S4 method for ProdEntries
+# S4 method for class 'ProdEntries'
 .column_grad(object, value)
 
-# S4 method for ProdEntries
+# S4 method for class 'ProdEntries'
 .grad(object, values)

Arguments

-
...
+ + +
...

Expression objects, vectors, or matrices.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
object
+
object

A ProdEntries object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

-
value
+
value

A numeric value.

Methods (by generic)

- +
  • to_numeric(ProdEntries): The product of all the entries.

  • sign_from_args(ProdEntries): Returns the sign (is positive, is negative) of the atom.

  • is_atom_convex(ProdEntries): Is the atom convex?

  • @@ -145,7 +147,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression representing a vector or matrix.

@@ -169,15 +171,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ProdEntries.html b/docs/reference/ProdEntries.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/ProdEntries.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Promote-class.html b/docs/reference/Promote-class.html index 350db3d4..8ab6abf2 100644 --- a/docs/reference/Promote-class.html +++ b/docs/reference/Promote-class.html @@ -1,9 +1,9 @@ -The Promote class. — Promote-class • CVXRThe Promote class. — Promote-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,61 +68,63 @@

The Promote class.

Promote(expr, promoted_dim)
 
-# S4 method for Promote
+# S4 method for class 'Promote'
 to_numeric(object, values)
 
-# S4 method for Promote
+# S4 method for class 'Promote'
 is_symmetric(object)
 
-# S4 method for Promote
+# S4 method for class 'Promote'
 dim_from_args(object)
 
-# S4 method for Promote
+# S4 method for class 'Promote'
 is_atom_log_log_convex(object)
 
-# S4 method for Promote
+# S4 method for class 'Promote'
 is_atom_log_log_concave(object)
 
-# S4 method for Promote
+# S4 method for class 'Promote'
 get_data(object)
 
-# S4 method for Promote
+# S4 method for class 'Promote'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
expr
+ + +
expr

An Expression or numeric constant.

-
promoted_dim
+
promoted_dim

The desired dimensions.

-
object
+
object

A Promote object.

-
values
+
values

A list containing the value to promote.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(Promote): Promotes the value to the new dimensions.

  • is_symmetric(Promote): Is the expression symmetric?

  • dim_from_args(Promote): Returns the (row, col) dimensions of the expression.

  • @@ -133,7 +135,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression or numeric constant.

@@ -157,15 +159,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Promote.html b/docs/reference/Promote.html new file mode 100644 index 00000000..3454ffa2 --- /dev/null +++ b/docs/reference/Promote.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Qp2SymbolicQp-class.html b/docs/reference/Qp2SymbolicQp-class.html index de51412e..cad71a80 100644 --- a/docs/reference/Qp2SymbolicQp-class.html +++ b/docs/reference/Qp2SymbolicQp-class.html @@ -1,10 +1,10 @@ The Qp2SymbolicQp class. — Qp2SymbolicQp-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -81,15 +81,15 @@

The Qp2SymbolicQp class.

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/QpMatrixStuffing-class.html b/docs/reference/QpMatrixStuffing-class.html index 6fed5c57..ff9bb19b 100644 --- a/docs/reference/QpMatrixStuffing-class.html +++ b/docs/reference/QpMatrixStuffing-class.html @@ -1,11 +1,11 @@ The QpMatrixStuffing class. — QpMatrixStuffing-class • CVXR - +
@@ -30,7 +30,7 @@
- +
@@ -89,15 +89,15 @@

Details

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/QpMatrixStuffing.html b/docs/reference/QpMatrixStuffing.html new file mode 100644 index 00000000..ff0e6c78 --- /dev/null +++ b/docs/reference/QpMatrixStuffing.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/QpSolver-class.html b/docs/reference/QpSolver-class.html index a59643da..d1ec1b6b 100644 --- a/docs/reference/QpSolver-class.html +++ b/docs/reference/QpSolver-class.html @@ -1,9 +1,9 @@ -A QP solver interface. — QpSolver-class • CVXRA QP solver interface. — QpSolver-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,26 +66,28 @@

A QP solver interface.

-
# S4 method for QpSolver,Problem
+    
# S4 method for class 'QpSolver,Problem'
 accepts(object, problem)
 
-# S4 method for QpSolver,Problem
+# S4 method for class 'QpSolver,Problem'
 perform(object, problem)

Arguments

-
object
+ + +
object

A QpSolver object.

-
problem
+
problem

A Problem object.

Methods (by generic)

- +
  • accepts(object = QpSolver, problem = Problem): Is this a QP problem?

  • perform(object = QpSolver, problem = Problem): Constructs a QP problem data stored in a list

@@ -102,15 +104,15 @@

Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/QuadForm-class.html b/docs/reference/QuadForm-class.html index 3dba06d7..ca6da20b 100644 --- a/docs/reference/QuadForm-class.html +++ b/docs/reference/QuadForm-class.html @@ -1,9 +1,9 @@ -The QuadForm class. — QuadForm-class • CVXRThe QuadForm class. — QuadForm-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,77 +68,79 @@

The QuadForm class.

QuadForm(x, P)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 name(x)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 allow_complex(object)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 to_numeric(object, values)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 validate_args(object)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 sign_from_args(object)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 dim_from_args(object)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 is_atom_convex(object)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 is_atom_concave(object)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 is_atom_log_log_convex(object)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 is_atom_log_log_concave(object)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 is_incr(object, idx)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 is_decr(object, idx)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 is_quadratic(object)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 is_pwl(object)
 
-# S4 method for QuadForm
+# S4 method for class 'QuadForm'
 .grad(object, values)

Arguments

-
x
+ + +
x

An Expression or numeric vector.

-
P
+
P

An Expression, numeric matrix, or vector.

-
object
+
object

A QuadForm object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • name(QuadForm): The name and arguments of the atom.

  • allow_complex(QuadForm): Does the atom handle complex numbers?

  • to_numeric(QuadForm): Returns the quadratic form.

  • @@ -157,7 +159,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric vector.

@@ -181,15 +183,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/QuadForm.html b/docs/reference/QuadForm.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/QuadForm.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/QuadOverLin-class.html b/docs/reference/QuadOverLin-class.html index e6c202e3..e2cc848a 100644 --- a/docs/reference/QuadOverLin-class.html +++ b/docs/reference/QuadOverLin-class.html @@ -1,9 +1,9 @@ -The QuadOverLin class. — QuadOverLin-class • CVXRThe QuadOverLin class. — QuadOverLin-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,77 +68,79 @@

The QuadOverLin class.

QuadOverLin(x, y)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 allow_complex(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 to_numeric(object, values)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 validate_args(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 dim_from_args(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 sign_from_args(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 is_atom_convex(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 is_atom_concave(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 is_atom_log_log_convex(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 is_atom_log_log_concave(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 is_incr(object, idx)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 is_decr(object, idx)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 is_quadratic(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 is_qpwa(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 .domain(object)
 
-# S4 method for QuadOverLin
+# S4 method for class 'QuadOverLin'
 .grad(object, values)

Arguments

-
x
+ + +
x

An Expression or numeric matrix.

-
y
+
y

A scalar Expression or numeric constant.

-
object
+
object

A QuadOverLin object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • allow_complex(QuadOverLin): Does the atom handle complex numbers?

  • to_numeric(QuadOverLin): The sum of the entries of x squared over y.

  • validate_args(QuadOverLin): Check the dimensions of the arguments.

  • @@ -157,7 +159,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric matrix.

@@ -181,15 +183,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/QuadOverLin.html b/docs/reference/QuadOverLin.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/QuadOverLin.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Rdict-class.html b/docs/reference/Rdict-class.html index 3eae4a28..8e4493f6 100644 --- a/docs/reference/Rdict-class.html +++ b/docs/reference/Rdict-class.html @@ -1,10 +1,10 @@ The Rdict class. — Rdict-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -68,61 +68,63 @@

The Rdict class.

-
Rdict(keys = list(), values = list())
-
-# S4 method for Rdict
-$(x, name)
-
-# S4 method for Rdict
-length(x)
-
-# S4 method for ANY,Rdict
-is.element(el, set)
-
-# S4 method for Rdict,ANY,ANY,ANY
-[(x, i, j, ..., drop = TRUE)
-
-# S4 method for Rdict,ANY,ANY,ANY
-[(x, i, j, ...) <- value
+
Rdict(keys = list(), values = list())
+
+# S4 method for class 'Rdict'
+x$name
+
+# S4 method for class 'Rdict'
+length(x)
+
+# S4 method for class 'ANY,Rdict'
+is.element(el, set)
+
+# S4 method for class 'Rdict,ANY,ANY,ANY'
+x[i, j, ..., drop = TRUE]
+
+# S4 method for class 'Rdict,ANY,ANY,ANY'
+x[i, j, ...] <- value

Arguments

-
keys
+ + +
keys

A list of keys.

-
values
+
values

A list of values corresponding to the keys.

-
x, set
+
x, set

A Rdict object.

-
name
+
name

Either "keys" for a list of keys, "values" for a list of values, or "items" for a list of lists where each nested list is a (key, value) pair.

-
el
+
el

The element to search the dictionary of values for.

-
i
+
i

A key into the dictionary.

-
j, drop, ...
+
j, drop, ...

Unused arguments.

-
value
+
value

The value to assign to key i.

Slots

- +
keys

A list of keys.

@@ -146,15 +148,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Rdict.html b/docs/reference/Rdict.html new file mode 100644 index 00000000..aa0a0d7c --- /dev/null +++ b/docs/reference/Rdict.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Rdictdefault-class.html b/docs/reference/Rdictdefault-class.html index 3a96ee12..d08463a7 100644 --- a/docs/reference/Rdictdefault-class.html +++ b/docs/reference/Rdictdefault-class.html @@ -1,10 +1,10 @@ The Rdictdefault class. — Rdictdefault-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -68,41 +68,43 @@

The Rdictdefault class.

-
Rdictdefault(keys = list(), values = list(), default)
-
-# S4 method for Rdictdefault,ANY,ANY,ANY
-[(x, i, j, ..., drop = TRUE)
+
Rdictdefault(keys = list(), values = list(), default)
+
+# S4 method for class 'Rdictdefault,ANY,ANY,ANY'
+x[i, j, ..., drop = TRUE]

Arguments

-
keys
+ + +
keys

A list of keys.

-
values
+
values

A list of values corresponding to the keys.

-
default
+
default

A function that takes as input a key and outputs a value to assign to that key.

-
x
+
x

A Rdictdefault object.

-
i
+
i

A key into the dictionary.

-
j, drop, ...
+
j, drop, ...

Unused arguments.

Slots

- +
keys

A list of keys.

@@ -134,15 +136,15 @@

See also

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Rdictdefault.html b/docs/reference/Rdictdefault.html new file mode 100644 index 00000000..dd816deb --- /dev/null +++ b/docs/reference/Rdictdefault.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Re,Expression-method.html b/docs/reference/Re,Expression-method.html new file mode 100644 index 00000000..654227e9 --- /dev/null +++ b/docs/reference/Re,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Real-class.html b/docs/reference/Real-class.html index c7d8f7d5..34622eb2 100644 --- a/docs/reference/Real-class.html +++ b/docs/reference/Real-class.html @@ -1,9 +1,9 @@ -The Real class. — Real-class • CVXRThe Real class. — Real-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,39 +68,41 @@

The Real class.

Real(expr)
 
-# S4 method for Real
+# S4 method for class 'Real'
 to_numeric(object, values)
 
-# S4 method for Real
+# S4 method for class 'Real'
 dim_from_args(object)
 
-# S4 method for Real
+# S4 method for class 'Real'
 is_imag(object)
 
-# S4 method for Real
+# S4 method for class 'Real'
 is_complex(object)
 
-# S4 method for Real
+# S4 method for class 'Real'
 is_symmetric(object)

Arguments

-
expr
+ + +
expr

An Expression representing a vector or matrix.

-
object
+
object

An Real object.

-
values
+
values

A list of arguments to the atom.

Methods (by generic)

- +
  • to_numeric(Real): The imaginary part of the given value.

  • dim_from_args(Real): The dimensions of the atom.

  • is_imag(Real): Is the atom imaginary?

  • @@ -109,7 +111,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression representing a vector or matrix.

@@ -129,15 +131,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Real.html b/docs/reference/Real.html new file mode 100644 index 00000000..80f9cd35 --- /dev/null +++ b/docs/reference/Real.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Reduction-class.html b/docs/reference/Reduction-class.html index 30a7c8dd..cb11edcd 100644 --- a/docs/reference/Reduction-class.html +++ b/docs/reference/Reduction-class.html @@ -3,11 +3,11 @@ into an equivalent problem. By equivalent, we mean that there exists a mapping between solutions of either problem: if we reduce a problem \(A\) to another problem \(B\) and then proceed to find a solution to \(B\), we can convert -it to a solution of \(A\) with at most a moderate amount of effort."> - +
@@ -32,7 +32,7 @@
- +
@@ -74,37 +74,39 @@

The Reduction class.

-
# S4 method for Reduction,Problem
+    
# S4 method for class 'Reduction,Problem'
 accepts(object, problem)
 
-# S4 method for Reduction
+# S4 method for class 'Reduction'
 reduce(object)
 
-# S4 method for Reduction,Solution
+# S4 method for class 'Reduction,Solution'
 retrieve(object, solution)
 
-# S4 method for Reduction,Problem
+# S4 method for class 'Reduction,Problem'
 perform(object, problem)
 
-# S4 method for Reduction,Solution,list
+# S4 method for class 'Reduction,Solution,list'
 invert(object, solution, inverse_data)

Arguments

-
object
+ + +
object

A Reduction object.

-
problem
+
problem

A Problem object.

-
solution
+
solution

A Solution to a problem that generated the inverse data.

-
inverse_data
+
inverse_data

The data encoding the original problem.

@@ -118,7 +120,7 @@

Details

Methods (by generic)

- +
  • accepts(object = Reduction, problem = Problem): States whether the reduction accepts a problem.

  • reduce(Reduction): Reduces the owned problem to an equivalent problem.

  • retrieve(object = Reduction, solution = Solution): Retrieves a solution to the owned problem.

  • @@ -138,15 +140,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/ReductionSolver-class.html b/docs/reference/ReductionSolver-class.html index 60153b49..975f5bcf 100644 --- a/docs/reference/ReductionSolver-class.html +++ b/docs/reference/ReductionSolver-class.html @@ -1,9 +1,9 @@ -The ReductionSolver class. — ReductionSolver-class • CVXRThe ReductionSolver class. — ReductionSolver-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,19 +66,19 @@

The ReductionSolver class.

-
# S4 method for ReductionSolver
+    
# S4 method for class 'ReductionSolver'
 mip_capable(solver)
 
-# S4 method for ReductionSolver
+# S4 method for class 'ReductionSolver'
 name(x)
 
-# S4 method for ReductionSolver
+# S4 method for class 'ReductionSolver'
 import_solver(solver)
 
-# S4 method for ReductionSolver
+# S4 method for class 'ReductionSolver'
 is_installed(solver)
 
-# S4 method for ReductionSolver
+# S4 method for class 'ReductionSolver'
 solve_via_data(
   object,
   data,
@@ -92,7 +92,7 @@ 

The ReductionSolver class.

solver_cache ) -# S4 method for ReductionSolver,ANY +# S4 method for class 'ReductionSolver,ANY' reduction_solve( object, problem, @@ -105,7 +105,7 @@

The ReductionSolver class.

solver_opts ) -# S4 method for ECOS +# S4 method for class 'ECOS' solve_via_data( object, data, @@ -122,53 +122,55 @@

The ReductionSolver class.

Arguments

-
solver, object, x
+ + +
solver, object, x

A ReductionSolver object.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

An integer number indicating level of solver verbosity.

-
feastol
+
feastol

The feasible tolerance on the primal and dual residual.

-
reltol
+
reltol

The relative tolerance on the duality gap.

-
abstol
+
abstol

The absolute tolerance on the duality gap.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

-
problem
+
problem

A Problem object.

Methods (by generic)

- +
  • mip_capable(ReductionSolver): Can the solver handle mixed-integer programs?

  • name(ReductionSolver): Returns the name of the solver

  • import_solver(ReductionSolver): Imports the solver

  • @@ -190,15 +192,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Reshape-class.html b/docs/reference/Reshape-class.html index 4f4513ef..65f552dc 100644 --- a/docs/reference/Reshape-class.html +++ b/docs/reference/Reshape-class.html @@ -1,10 +1,10 @@ The Reshape class. — Reshape-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -70,61 +70,63 @@

The Reshape class.

Reshape(expr, new_dim)
 
-# S4 method for Reshape
+# S4 method for class 'Reshape'
 to_numeric(object, values)
 
-# S4 method for Reshape
+# S4 method for class 'Reshape'
 validate_args(object)
 
-# S4 method for Reshape
+# S4 method for class 'Reshape'
 dim_from_args(object)
 
-# S4 method for Reshape
+# S4 method for class 'Reshape'
 is_atom_log_log_convex(object)
 
-# S4 method for Reshape
+# S4 method for class 'Reshape'
 is_atom_log_log_concave(object)
 
-# S4 method for Reshape
+# S4 method for class 'Reshape'
 get_data(object)
 
-# S4 method for Reshape
+# S4 method for class 'Reshape'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
expr
+ + +
expr

An Expression or numeric matrix.

-
new_dim
+
new_dim

The new dimensions.

-
object
+
object

A Reshape object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(Reshape): Reshape the value into the specified dimensions.

  • validate_args(Reshape): Check the new shape has the same number of entries as the old.

  • dim_from_args(Reshape): The c(rows, cols) dimensions of the new expression.

  • @@ -135,7 +137,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression or numeric matrix.

@@ -159,15 +161,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Rplot001.png b/docs/reference/Rplot001.png deleted file mode 100644 index 17a35806..00000000 Binary files a/docs/reference/Rplot001.png and /dev/null differ diff --git a/docs/reference/SCS-class.html b/docs/reference/SCS-class.html index 820c9128..189ba96e 100644 --- a/docs/reference/SCS-class.html +++ b/docs/reference/SCS-class.html @@ -1,9 +1,9 @@ -An interface for the SCS solver — SCS-class • CVXRAn interface for the SCS solver — SCS-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,28 +68,28 @@

An interface for the SCS solver

SCS()
 
-# S4 method for SCS
+# S4 method for class 'SCS'
 mip_capable(solver)
 
-# S4 method for SCS
+# S4 method for class 'SCS'
 status_map(solver, status)
 
-# S4 method for SCS
+# S4 method for class 'SCS'
 name(x)
 
-# S4 method for SCS
+# S4 method for class 'SCS'
 import_solver(solver)
 
-# S4 method for SCS
+# S4 method for class 'SCS'
 reduction_format_constr(object, problem, constr, exp_cone_order)
 
-# S4 method for SCS,Problem
+# S4 method for class 'SCS,Problem'
 perform(object, problem)
 
-# S4 method for SCS,list,list
+# S4 method for class 'SCS,list,list'
 invert(object, solution, inverse_data)
 
-# S4 method for SCS
+# S4 method for class 'SCS'
 solve_via_data(
   object,
   data,
@@ -106,73 +106,75 @@ 

An interface for the SCS solver

Arguments

-
solver, object, x
+ + +
solver, object, x

A SCS object.

-
status
+
status

A status code returned by the solver.

-
problem
+
problem

A Problem object.

-
constr
+
constr

A Constraint to format.

-
exp_cone_order
+
exp_cone_order

A list indicating how the exponential cone arguments are ordered.

-
solution
+
solution

The raw solution returned by the solver.

-
inverse_data
+
inverse_data

A list containing data necessary for the inversion.

-
data
+
data

Data generated via an apply call.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance on the primal and dual residual.

-
reltol
+
reltol

The relative tolerance on the duality gap.

-
abstol
+
abstol

The absolute tolerance on the duality gap.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
solver_cache
+
solver_cache

Cache for the solver.

Methods (by generic)

- +
  • mip_capable(SCS): Can the solver handle mixed-integer programs?

  • status_map(SCS): Converts status returned by SCS solver to its respective CVXPY status.

  • name(SCS): Returns the name of the solver

  • @@ -195,15 +197,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SCS.dims_to_solver_dict.html b/docs/reference/SCS.dims_to_solver_dict.html index 4a6df371..b943e8d9 100644 --- a/docs/reference/SCS.dims_to_solver_dict.html +++ b/docs/reference/SCS.dims_to_solver_dict.html @@ -1,10 +1,10 @@ Utility method for formatting a ConeDims instance into a dictionary that can be supplied to SCS. — SCS.dims_to_solver_dict • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -73,15 +73,15 @@

Utility method for formatting a ConeDims instance into a dictionary that can

Arguments

-
cone_dims
+ + +
cone_dims

A ConeDims instance.

Value

- - -

The dimensions of the cones.

+

The dimensions of the cones.

@@ -96,15 +96,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SCS.extract_dual_value.html b/docs/reference/SCS.extract_dual_value.html index 983fd2c4..81f007a0 100644 --- a/docs/reference/SCS.extract_dual_value.html +++ b/docs/reference/SCS.extract_dual_value.html @@ -1,9 +1,9 @@ -Extracts the dual value for constraint starting at offset. — SCS.extract_dual_value • CVXRExtracts the dual value for constraint starting at offset. — SCS.extract_dual_value • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Extracts the dual value for constraint starting at offset.

Arguments

-
result_vec
+ + +
result_vec

The vector to extract dual values from.

-
offset
+
offset

The starting point of the vector to extract from.

-
constraint
+
constraint

A Constraint object.

Value

- - -

The dual values for the corresponding PSD constraints

+

The dual values for the corresponding PSD constraints

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SCS.html b/docs/reference/SCS.html new file mode 100644 index 00000000..5e0523ec --- /dev/null +++ b/docs/reference/SCS.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/SOC-class.html b/docs/reference/SOC-class.html index b1f7fb26..5d2003f1 100644 --- a/docs/reference/SOC-class.html +++ b/docs/reference/SOC-class.html @@ -1,9 +1,9 @@ -The SOC class. — SOC-class • CVXRThe SOC class. — SOC-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,78 +68,80 @@

The SOC class.

SOC(t, X, axis = 2, id = NA_integer_)
 
-# S4 method for SOC
+# S4 method for class 'SOC'
 as.character(x)
 
-# S4 method for SOC
+# S4 method for class 'SOC'
 residual(object)
 
-# S4 method for SOC
+# S4 method for class 'SOC'
 get_data(object)
 
-# S4 method for SOC
+# S4 method for class 'SOC'
 format_constr(object, eq_constr, leq_constr, dims, solver)
 
-# S4 method for SOC
+# S4 method for class 'SOC'
 num_cones(object)
 
-# S4 method for SOC
+# S4 method for class 'SOC'
 size(object)
 
-# S4 method for SOC
+# S4 method for class 'SOC'
 cone_sizes(object)
 
-# S4 method for SOC
+# S4 method for class 'SOC'
 is_dcp(object)
 
-# S4 method for SOC
+# S4 method for class 'SOC'
 is_dgp(object)
 
-# S4 method for SOC
+# S4 method for class 'SOC'
 canonicalize(object)

Arguments

-
t
+ + +
t

The scalar part of the second-order constraint.

-
X
+
X

A matrix whose rows/columns are each a cone.

-
axis
+
axis

The dimension along which to slice: 1 indicates rows, and 2 indicates columns. The default is 2.

-
id
+
id

(Optional) A numeric value representing the constraint ID.

-
x, object
+
x, object

A SOC object.

-
eq_constr
+
eq_constr

A list of the equality constraints in the canonical problem.

-
leq_constr
+
leq_constr

A list of the inequality constraints in the canonical problem.

-
dims
+
dims

A list with the dimensions of the conic constraints.

-
solver
+
solver

A string representing the solver to be called.

Methods (by generic)

- +
  • residual(SOC): The residual of the second-order constraint.

  • get_data(SOC): Information needed to reconstruct the object aside from the args.

  • format_constr(SOC): Format SOC constraints as inequalities for the solver.

  • @@ -152,7 +154,7 @@

    Methods (by generic)

Slots

- +
t

The scalar part of the second-order constraint.

@@ -180,15 +182,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SOC.html b/docs/reference/SOC.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/SOC.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/SOCAxis-class.html b/docs/reference/SOCAxis-class.html index 03fb50f0..48f07863 100644 --- a/docs/reference/SOCAxis-class.html +++ b/docs/reference/SOCAxis-class.html @@ -1,10 +1,10 @@ The SOCAxis class. — SOCAxis-class • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -70,63 +70,65 @@

The SOCAxis class.

SOCAxis(t, X, axis, id = NA_integer_)
 
-# S4 method for SOCAxis
+# S4 method for class 'SOCAxis'
 as.character(x)
 
-# S4 method for SOCAxis
+# S4 method for class 'SOCAxis'
 format_constr(object, eq_constr, leq_constr, dims, solver)
 
-# S4 method for SOCAxis
+# S4 method for class 'SOCAxis'
 num_cones(object)
 
-# S4 method for SOCAxis
+# S4 method for class 'SOCAxis'
 cone_sizes(object)
 
-# S4 method for SOCAxis
+# S4 method for class 'SOCAxis'
 size(object)

Arguments

-
t
+ + +
t

The scalar part of the second-order constraint.

-
X
+
X

A matrix whose rows/columns are each a cone.

-
axis
+
axis

The dimension across which to take the slice: 1 indicates rows, and 2 indicates columns.

-
id
+
id

(Optional) A numeric value representing the constraint ID.

-
x, object
+
x, object

A SOCAxis object.

-
eq_constr
+
eq_constr

A list of the equality constraints in the canonical problem.

-
leq_constr
+
leq_constr

A list of the inequality constraints in the canonical problem.

-
dims
+
dims

A list with the dimensions of the conic constraints.

-
solver
+
solver

A string representing the solver to be called.

Methods (by generic)

- +
  • format_constr(SOCAxis): Format SOC constraints as inequalities for the solver.

  • num_cones(SOCAxis): The number of elementwise cones.

  • cone_sizes(SOCAxis): The dimensions of a single cone.

  • @@ -134,7 +136,7 @@

    Methods (by generic)

Slots

- +
t

The scalar part of the second-order constraint.

@@ -162,15 +164,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SOCAxis.html b/docs/reference/SOCAxis.html new file mode 100644 index 00000000..07ea6c39 --- /dev/null +++ b/docs/reference/SOCAxis.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/SigmaMax-class.html b/docs/reference/SigmaMax-class.html index b4b10bac..290c8839 100644 --- a/docs/reference/SigmaMax-class.html +++ b/docs/reference/SigmaMax-class.html @@ -1,9 +1,9 @@ -The SigmaMax class. — SigmaMax-class • CVXRThe SigmaMax class. — SigmaMax-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,55 +68,57 @@

The SigmaMax class.

SigmaMax(A = A)
 
-# S4 method for SigmaMax
+# S4 method for class 'SigmaMax'
 to_numeric(object, values)
 
-# S4 method for SigmaMax
+# S4 method for class 'SigmaMax'
 allow_complex(object)
 
-# S4 method for SigmaMax
+# S4 method for class 'SigmaMax'
 dim_from_args(object)
 
-# S4 method for SigmaMax
+# S4 method for class 'SigmaMax'
 sign_from_args(object)
 
-# S4 method for SigmaMax
+# S4 method for class 'SigmaMax'
 is_atom_convex(object)
 
-# S4 method for SigmaMax
+# S4 method for class 'SigmaMax'
 is_atom_concave(object)
 
-# S4 method for SigmaMax
+# S4 method for class 'SigmaMax'
 is_incr(object, idx)
 
-# S4 method for SigmaMax
+# S4 method for class 'SigmaMax'
 is_decr(object, idx)
 
-# S4 method for SigmaMax
+# S4 method for class 'SigmaMax'
 .grad(object, values)

Arguments

-
A
+ + +
A

An Expression or matrix.

-
object
+
object

A SigmaMax object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(SigmaMax): The largest singular value of A.

  • allow_complex(SigmaMax): Does the atom handle complex numbers?

  • dim_from_args(SigmaMax): The atom is a scalar.

  • @@ -129,7 +131,7 @@

    Methods (by generic)

Slots

- +
A

An Expression or numeric matrix.

@@ -149,15 +151,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SigmaMax.html b/docs/reference/SigmaMax.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/SigmaMax.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/SizeMetrics-class.html b/docs/reference/SizeMetrics-class.html index 26d03b32..98bc4cb0 100644 --- a/docs/reference/SizeMetrics-class.html +++ b/docs/reference/SizeMetrics-class.html @@ -1,9 +1,9 @@ -The SizeMetrics class. — SizeMetrics-class • CVXRThe SizeMetrics class. — SizeMetrics-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,13 +71,15 @@

The SizeMetrics class.

Arguments

-
problem
+ + +
problem

A Problem object.

Slots

- +
num_scalar_variables

The number of scalar variables in the problem.

@@ -117,15 +119,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SizeMetrics.html b/docs/reference/SizeMetrics.html new file mode 100644 index 00000000..3eab363c --- /dev/null +++ b/docs/reference/SizeMetrics.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Solution-class.html b/docs/reference/Solution-class.html index 0aa42f1d..8fe4df9f 100644 --- a/docs/reference/Solution-class.html +++ b/docs/reference/Solution-class.html @@ -1,9 +1,9 @@ -The Solution class. — Solution-class • CVXRThe Solution class. — Solution-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,13 +66,15 @@

The Solution class.

-
# S4 method for Solution
+    
# S4 method for class 'Solution'
 as.character(x)

Arguments

-
x
+ + +
x

A Solution object.

@@ -89,15 +91,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SolverStats-class.html b/docs/reference/SolverStats-class.html index 8e7e2664..50a34c63 100644 --- a/docs/reference/SolverStats-class.html +++ b/docs/reference/SolverStats-class.html @@ -1,9 +1,9 @@ -The SolverStats class. — SolverStats-class • CVXRThe SolverStats class. — SolverStats-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

The SolverStats class.

Arguments

-
results_dict
+ + +
results_dict

A list containing the results returned by the solver.

-
solver_name
+
solver_name

The name of the solver.

Value

- - -

A list containing

solver_name
+

A list containing

solver_name

The name of the solver.

solve_time
@@ -99,7 +99,7 @@

Value

Slots

- +
solver_name

The name of the solver.

@@ -131,15 +131,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SolverStats.html b/docs/reference/SolverStats.html new file mode 100644 index 00000000..49c271ce --- /dev/null +++ b/docs/reference/SolverStats.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/SolvingChain-class.html b/docs/reference/SolvingChain-class.html index 0bf6bbcd..a021f411 100644 --- a/docs/reference/SolvingChain-class.html +++ b/docs/reference/SolvingChain-class.html @@ -1,9 +1,9 @@ -The SolvingChain class. — SolvingChain-class • CVXRThe SolvingChain class. — SolvingChain-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,10 +66,10 @@

The SolvingChain class.

-
# S4 method for SolvingChain,Chain
+    
# S4 method for class 'SolvingChain,Chain'
 prepend(object, chain)
 
-# S4 method for SolvingChain,Problem
+# S4 method for class 'SolvingChain,Problem'
 reduction_solve(
   object,
   problem,
@@ -82,7 +82,7 @@ 

The SolvingChain class.

solver_opts ) -# S4 method for SolvingChain +# S4 method for class 'SolvingChain' reduction_solve_via_data( object, problem, @@ -99,53 +99,55 @@

The SolvingChain class.

Arguments

-
object
+ + +
object

A SolvingChain object.

-
chain
+
chain

A Chain to prepend.

-
problem
+
problem

The problem to solve.

-
warm_start
+
warm_start

A boolean of whether to warm start the solver.

-
verbose
+
verbose

A boolean of whether to enable solver verbosity.

-
feastol
+
feastol

The feasible tolerance.

-
reltol
+
reltol

The relative tolerance.

-
abstol
+
abstol

The absolute tolerance.

-
num_iter
+
num_iter

The maximum number of iterations.

-
solver_opts
+
solver_opts

A list of Solver specific options

-
data
+
data

Data for the solver.

Methods (by generic)

- +
  • prepend(object = SolvingChain, chain = Chain): Create and return a new SolvingChain by concatenating chain with this instance.

  • reduction_solve(object = SolvingChain, problem = Problem): Applies each reduction in the chain to the problem, solves it, and then inverts the chain to return a solution of the supplied problem.

  • @@ -164,15 +166,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SpecialIndex-class.html b/docs/reference/SpecialIndex-class.html index 73d37e09..ad1bc5eb 100644 --- a/docs/reference/SpecialIndex-class.html +++ b/docs/reference/SpecialIndex-class.html @@ -1,9 +1,9 @@ -The SpecialIndex class. — [,Expression,index,missing,ANY-method • CVXRThe SpecialIndex class. — [,Expression,index,missing,ANY-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,74 +66,76 @@

The SpecialIndex class.

-
# S4 method for Expression,index,missing,ANY
-[(x, i, j, ..., drop = TRUE)
-
-# S4 method for Expression,missing,index,ANY
-[(x, i, j, ..., drop = TRUE)
-
-# S4 method for Expression,index,index,ANY
-[(x, i, j, ..., drop = TRUE)
-
-# S4 method for Expression,matrix,index,ANY
-[(x, i, j, ..., drop = TRUE)
-
-# S4 method for Expression,index,matrix,ANY
-[(x, i, j, ..., drop = TRUE)
-
-# S4 method for Expression,matrix,matrix,ANY
-[(x, i, j, ..., drop = TRUE)
-
-# S4 method for Expression,matrix,missing,ANY
-[(x, i, j, ..., drop = TRUE)
-
-SpecialIndex(expr, key)
-
-# S4 method for SpecialIndex
-name(x)
-
-# S4 method for SpecialIndex
-is_atom_log_log_convex(object)
-
-# S4 method for SpecialIndex
-is_atom_log_log_concave(object)
-
-# S4 method for SpecialIndex
-get_data(object)
-
-# S4 method for SpecialIndex
-.grad(object)
+
# S4 method for class 'Expression,index,missing,ANY'
+x[i, j, ..., drop = TRUE]
+
+# S4 method for class 'Expression,missing,index,ANY'
+x[i, j, ..., drop = TRUE]
+
+# S4 method for class 'Expression,index,index,ANY'
+x[i, j, ..., drop = TRUE]
+
+# S4 method for class 'Expression,matrix,index,ANY'
+x[i, j, ..., drop = TRUE]
+
+# S4 method for class 'Expression,index,matrix,ANY'
+x[i, j, ..., drop = TRUE]
+
+# S4 method for class 'Expression,matrix,matrix,ANY'
+x[i, j, ..., drop = TRUE]
+
+# S4 method for class 'Expression,matrix,missing,ANY'
+x[i, j, ..., drop = TRUE]
+
+SpecialIndex(expr, key)
+
+# S4 method for class 'SpecialIndex'
+name(x)
+
+# S4 method for class 'SpecialIndex'
+is_atom_log_log_convex(object)
+
+# S4 method for class 'SpecialIndex'
+is_atom_log_log_concave(object)
+
+# S4 method for class 'SpecialIndex'
+get_data(object)
+
+# S4 method for class 'SpecialIndex'
+.grad(object)

Arguments

-
x, object
+ + +
x, object

An Index object.

-
i, j
+
i, j

The row and column indices of the slice.

-
...
+
...

(Unimplemented) Optional arguments.

-
drop
+
drop

(Unimplemented) A logical value indicating whether the result should be coerced to the lowest possible dimension.

-
expr
+
expr

An Expression representing a vector or matrix.

-
key
+
key

A list containing the start index, end index, and step size of the slice.

Methods (by generic)

- +
  • name(SpecialIndex): Returns the index in string form.

  • is_atom_log_log_convex(SpecialIndex): Is the atom log-log convex?

  • is_atom_log_log_concave(SpecialIndex): Is the atom log-log concave?

  • @@ -142,7 +144,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression representing a vector or matrix.

@@ -166,15 +168,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SpecialIndex.html b/docs/reference/SpecialIndex.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/SpecialIndex.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/SumEntries-class.html b/docs/reference/SumEntries-class.html index 6394f4fe..2051f380 100644 --- a/docs/reference/SumEntries-class.html +++ b/docs/reference/SumEntries-class.html @@ -1,9 +1,9 @@ -The SumEntries class. — SumEntries-class • CVXRThe SumEntries class. — SumEntries-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,56 +68,58 @@

The SumEntries class.

SumEntries(expr, axis = NA_real_, keepdims = FALSE)
 
-# S4 method for SumEntries
+# S4 method for class 'SumEntries'
 to_numeric(object, values)
 
-# S4 method for SumEntries
+# S4 method for class 'SumEntries'
 is_atom_log_log_convex(object)
 
-# S4 method for SumEntries
+# S4 method for class 'SumEntries'
 is_atom_log_log_concave(object)
 
-# S4 method for SumEntries
+# S4 method for class 'SumEntries'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
expr
+ + +
expr

An Expression representing a vector or matrix.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
object
+
object

A SumEntries object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(SumEntries): Sum the entries along the specified axis.

  • is_atom_log_log_convex(SumEntries): Is the atom log-log convex?

  • is_atom_log_log_concave(SumEntries): Is the atom log-log concave?

  • @@ -125,7 +127,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression representing a vector or matrix.

@@ -153,15 +155,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SumEntries.html b/docs/reference/SumEntries.html new file mode 100644 index 00000000..4b2e8863 --- /dev/null +++ b/docs/reference/SumEntries.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/SumLargest-class.html b/docs/reference/SumLargest-class.html index 95ef14d4..9bb7b962 100644 --- a/docs/reference/SumLargest-class.html +++ b/docs/reference/SumLargest-class.html @@ -1,9 +1,9 @@ -The SumLargest class. — SumLargest-class • CVXRThe SumLargest class. — SumLargest-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,62 +68,64 @@

The SumLargest class.

SumLargest(x, k)
 
-# S4 method for SumLargest
+# S4 method for class 'SumLargest'
 to_numeric(object, values)
 
-# S4 method for SumLargest
+# S4 method for class 'SumLargest'
 validate_args(object)
 
-# S4 method for SumLargest
+# S4 method for class 'SumLargest'
 dim_from_args(object)
 
-# S4 method for SumLargest
+# S4 method for class 'SumLargest'
 sign_from_args(object)
 
-# S4 method for SumLargest
+# S4 method for class 'SumLargest'
 is_atom_convex(object)
 
-# S4 method for SumLargest
+# S4 method for class 'SumLargest'
 is_atom_concave(object)
 
-# S4 method for SumLargest
+# S4 method for class 'SumLargest'
 is_incr(object, idx)
 
-# S4 method for SumLargest
+# S4 method for class 'SumLargest'
 is_decr(object, idx)
 
-# S4 method for SumLargest
+# S4 method for class 'SumLargest'
 get_data(object)
 
-# S4 method for SumLargest
+# S4 method for class 'SumLargest'
 .grad(object, values)

Arguments

-
x
+ + +
x

An Expression or numeric matrix.

-
k
+
k

The number of largest values to sum over.

-
object
+
object

A SumLargest object.

-
values
+
values

A list of numeric values for the arguments

-
idx
+
idx

An index into the atom.

Methods (by generic)

- +
  • to_numeric(SumLargest): The sum of the k largest entries of the vector or matrix.

  • validate_args(SumLargest): Check that k is a positive integer.

  • dim_from_args(SumLargest): The atom is a scalar.

  • @@ -137,7 +139,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric matrix.

@@ -161,15 +163,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SumLargest.html b/docs/reference/SumLargest.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/SumLargest.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/SumSmallest.html b/docs/reference/SumSmallest.html index d7007e23..42eaad19 100644 --- a/docs/reference/SumSmallest.html +++ b/docs/reference/SumSmallest.html @@ -1,9 +1,9 @@ -The SumSmallest atom. — SumSmallest • CVXRThe SumSmallest atom. — SumSmallest • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

The SumSmallest atom.

Arguments

-
x
+ + +
x

An Expression or numeric matrix.

-
k
+
k

The number of smallest values to sum over.

Value

- - -

Sum of the smlalest k values

+

Sum of the smlalest k values

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SumSquares.html b/docs/reference/SumSquares.html index c6a823c1..f9177166 100644 --- a/docs/reference/SumSquares.html +++ b/docs/reference/SumSquares.html @@ -1,9 +1,9 @@ -The SumSquares atom. — SumSquares • CVXRThe SumSquares atom. — SumSquares • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

The SumSquares atom.

Arguments

-
expr
+ + +
expr

An Expression or numeric matrix.

Value

- - -

Sum of the squares of the entries in the expression.

+

Sum of the squares of the entries in the expression.

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SymbolicQuadForm-class.html b/docs/reference/SymbolicQuadForm-class.html index 3d8831e2..261a0f4c 100644 --- a/docs/reference/SymbolicQuadForm-class.html +++ b/docs/reference/SymbolicQuadForm-class.html @@ -1,9 +1,9 @@ -The SymbolicQuadForm class. — SymbolicQuadForm-class • CVXRThe SymbolicQuadForm class. — SymbolicQuadForm-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,63 +68,65 @@

The SymbolicQuadForm class.

SymbolicQuadForm(x, P, expr)
 
-# S4 method for SymbolicQuadForm
+# S4 method for class 'SymbolicQuadForm'
 dim_from_args(object)
 
-# S4 method for SymbolicQuadForm
+# S4 method for class 'SymbolicQuadForm'
 sign_from_args(object)
 
-# S4 method for SymbolicQuadForm
+# S4 method for class 'SymbolicQuadForm'
 get_data(object)
 
-# S4 method for SymbolicQuadForm
+# S4 method for class 'SymbolicQuadForm'
 is_atom_convex(object)
 
-# S4 method for SymbolicQuadForm
+# S4 method for class 'SymbolicQuadForm'
 is_atom_concave(object)
 
-# S4 method for SymbolicQuadForm
+# S4 method for class 'SymbolicQuadForm'
 is_incr(object, idx)
 
-# S4 method for SymbolicQuadForm
+# S4 method for class 'SymbolicQuadForm'
 is_decr(object, idx)
 
-# S4 method for SymbolicQuadForm
+# S4 method for class 'SymbolicQuadForm'
 is_quadratic(object)
 
-# S4 method for SymbolicQuadForm
+# S4 method for class 'SymbolicQuadForm'
 .grad(object, values)

Arguments

-
x
+ + +
x

An Expression or numeric vector.

-
P
+
P

An Expression, numeric matrix, or vector.

-
expr
+
expr

The original Expression.

-
object
+
object

A SymbolicQuadForm object.

-
idx
+
idx

An index into the atom.

-
values
+
values

A list of numeric values for the arguments

Methods (by generic)

- +
  • dim_from_args(SymbolicQuadForm): The dimensions of the atom.

  • sign_from_args(SymbolicQuadForm): The sign (is positive, is negative) of the atom.

  • get_data(SymbolicQuadForm): The original expression.

  • @@ -137,7 +139,7 @@

    Methods (by generic)

Slots

- +
x

An Expression or numeric vector.

@@ -165,15 +167,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/SymbolicQuadForm.html b/docs/reference/SymbolicQuadForm.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/SymbolicQuadForm.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/TotalVariation.html b/docs/reference/TotalVariation.html index 096525d7..a3028a2c 100644 --- a/docs/reference/TotalVariation.html +++ b/docs/reference/TotalVariation.html @@ -1,10 +1,10 @@ The TotalVariation atom. — TotalVariation • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -73,19 +73,19 @@

The TotalVariation atom.

Arguments

-
value
+ + +
value

An Expression representing the value to take the total variation of.

-
...
+
...

Additional matrices extending the third dimension of value.

Value

- - -

An expression representing the total variation.

+

An expression representing the total variation.

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Trace-class.html b/docs/reference/Trace-class.html index ceae9c92..44ea1bb0 100644 --- a/docs/reference/Trace-class.html +++ b/docs/reference/Trace-class.html @@ -1,9 +1,9 @@ -The Trace class. — Trace-class • CVXRThe Trace class. — Trace-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,54 +68,56 @@

The Trace class.

Trace(expr)
 
-# S4 method for Trace
+# S4 method for class 'Trace'
 to_numeric(object, values)
 
-# S4 method for Trace
+# S4 method for class 'Trace'
 validate_args(object)
 
-# S4 method for Trace
+# S4 method for class 'Trace'
 dim_from_args(object)
 
-# S4 method for Trace
+# S4 method for class 'Trace'
 is_atom_log_log_convex(object)
 
-# S4 method for Trace
+# S4 method for class 'Trace'
 is_atom_log_log_concave(object)
 
-# S4 method for Trace
+# S4 method for class 'Trace'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
expr
+ + +
expr

An Expression representing a matrix.

-
object
+
object

A Trace object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(Trace): Sum the diagonal entries.

  • validate_args(Trace): Check the argument is a square matrix.

  • dim_from_args(Trace): The atom is a scalar.

  • @@ -125,7 +127,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression representing a matrix.

@@ -145,15 +147,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Transpose-class.html b/docs/reference/Transpose-class.html index 18d21b9c..08287b70 100644 --- a/docs/reference/Transpose-class.html +++ b/docs/reference/Transpose-class.html @@ -1,9 +1,9 @@ -The Transpose class. — Transpose-class • CVXRThe Transpose class. — Transpose-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,56 +66,58 @@

The Transpose class.

-
# S4 method for Transpose
+    
# S4 method for class 'Transpose'
 to_numeric(object, values)
 
-# S4 method for Transpose
+# S4 method for class 'Transpose'
 is_symmetric(object)
 
-# S4 method for Transpose
+# S4 method for class 'Transpose'
 is_hermitian(object)
 
-# S4 method for Transpose
+# S4 method for class 'Transpose'
 dim_from_args(object)
 
-# S4 method for Transpose
+# S4 method for class 'Transpose'
 is_atom_log_log_convex(object)
 
-# S4 method for Transpose
+# S4 method for class 'Transpose'
 is_atom_log_log_concave(object)
 
-# S4 method for Transpose
+# S4 method for class 'Transpose'
 get_data(object)
 
-# S4 method for Transpose
+# S4 method for class 'Transpose'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
object
+ + +
object

A Transpose object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(Transpose): The transpose of the given value.

  • is_symmetric(Transpose): Is the expression symmetric?

  • is_hermitian(Transpose): Is the expression hermitian?

  • @@ -138,15 +140,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/UnaryOperator-class.html b/docs/reference/UnaryOperator-class.html index fcaa74b8..5bb99d9b 100644 --- a/docs/reference/UnaryOperator-class.html +++ b/docs/reference/UnaryOperator-class.html @@ -1,9 +1,9 @@ -The UnaryOperator class. — UnaryOperator-class • CVXRThe UnaryOperator class. — UnaryOperator-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,32 +66,34 @@

The UnaryOperator class.

-
# S4 method for UnaryOperator
+    
# S4 method for class 'UnaryOperator'
 name(x)
 
-# S4 method for UnaryOperator
+# S4 method for class 'UnaryOperator'
 to_numeric(object, values)

Arguments

-
x, object
+ + +
x, object

A UnaryOperator object.

-
values
+
values

A list of arguments to the atom.

Methods (by generic)

- +
  • name(UnaryOperator): Returns the expression in string form.

  • to_numeric(UnaryOperator): Applies the unary operator to the value.

Slots

- +
expr

The Expression that is being operated upon.

@@ -115,15 +117,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/UnaryOperator.html b/docs/reference/UnaryOperator.html new file mode 100644 index 00000000..67e5d145 --- /dev/null +++ b/docs/reference/UnaryOperator.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/UpperTri-class.html b/docs/reference/UpperTri-class.html index 18ec8636..150b7d89 100644 --- a/docs/reference/UpperTri-class.html +++ b/docs/reference/UpperTri-class.html @@ -1,9 +1,9 @@ -The UpperTri class. — UpperTri-class • CVXRThe UpperTri class. — UpperTri-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,54 +68,56 @@

The UpperTri class.

UpperTri(expr)
 
-# S4 method for UpperTri
+# S4 method for class 'UpperTri'
 to_numeric(object, values)
 
-# S4 method for UpperTri
+# S4 method for class 'UpperTri'
 validate_args(object)
 
-# S4 method for UpperTri
+# S4 method for class 'UpperTri'
 dim_from_args(object)
 
-# S4 method for UpperTri
+# S4 method for class 'UpperTri'
 is_atom_log_log_convex(object)
 
-# S4 method for UpperTri
+# S4 method for class 'UpperTri'
 is_atom_log_log_concave(object)
 
-# S4 method for UpperTri
+# S4 method for class 'UpperTri'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
expr
+ + +
expr

An Expression or numeric matrix.

-
object
+
object

An UpperTri object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(UpperTri): Vectorize the upper triagonal entries.

  • validate_args(UpperTri): Check the argument is a square matrix.

  • dim_from_args(UpperTri): The dimensions of the atom.

  • @@ -125,7 +127,7 @@

    Methods (by generic)

Slots

- +
expr

An Expression or numeric matrix.

@@ -145,15 +147,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/UpperTri.html b/docs/reference/UpperTri.html new file mode 100644 index 00000000..0d5027f1 --- /dev/null +++ b/docs/reference/UpperTri.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/VStack-class.html b/docs/reference/VStack-class.html index 85e8e515..43881646 100644 --- a/docs/reference/VStack-class.html +++ b/docs/reference/VStack-class.html @@ -1,9 +1,9 @@ -The VStack class. — VStack-class • CVXRThe VStack class. — VStack-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,54 +68,56 @@

The VStack class.

VStack(...)
 
-# S4 method for VStack
+# S4 method for class 'VStack'
 to_numeric(object, values)
 
-# S4 method for VStack
+# S4 method for class 'VStack'
 validate_args(object)
 
-# S4 method for VStack
+# S4 method for class 'VStack'
 dim_from_args(object)
 
-# S4 method for VStack
+# S4 method for class 'VStack'
 is_atom_log_log_convex(object)
 
-# S4 method for VStack
+# S4 method for class 'VStack'
 is_atom_log_log_concave(object)
 
-# S4 method for VStack
+# S4 method for class 'VStack'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
...
+ + +
...

Expression objects or matrices. All arguments must have the same number of columns.

-
object
+
object

A VStack object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(VStack): Vertically concatenate the values using rbind.

  • validate_args(VStack): Check all arguments have the same width.

  • dim_from_args(VStack): The dimensions of the atom.

  • @@ -125,7 +127,7 @@

    Methods (by generic)

Slots

- +
...

Expression objects or matrices. All arguments must have the same number of columns.

@@ -145,15 +147,15 @@

Slots

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Variable-class.html b/docs/reference/Variable-class.html index b746b8f7..2be5655f 100644 --- a/docs/reference/Variable-class.html +++ b/docs/reference/Variable-class.html @@ -1,9 +1,9 @@ -The Variable class. — Variable-class • CVXRThe Variable class. — Variable-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,50 +68,52 @@

The Variable class.

Variable(rows = NULL, cols = NULL, name = NA_character_, ...)
 
-# S4 method for Variable
+# S4 method for class 'Variable'
 as.character(x)
 
-# S4 method for Variable
+# S4 method for class 'Variable'
 name(x)
 
-# S4 method for Variable
+# S4 method for class 'Variable'
 value(object)
 
-# S4 method for Variable
+# S4 method for class 'Variable'
 grad(object)
 
-# S4 method for Variable
+# S4 method for class 'Variable'
 variables(object)
 
-# S4 method for Variable
+# S4 method for class 'Variable'
 canonicalize(object)

Arguments

-
rows
+ + +
rows

The number of rows in the variable.

-
cols
+
cols

The number of columns in the variable.

-
name
+
name

(Optional) A character string representing the name of the variable.

-
...
+
...

(Optional) Additional attribute arguments. See Leaf for details.

-
x, object
+
x, object

A Variable object.

Methods (by generic)

- +
  • name(Variable): The name of the variable.

  • value(Variable): Get the value of the variable.

  • grad(Variable): The sub/super-gradient of the variable represented as a sparse matrix.

  • @@ -120,7 +122,7 @@

    Methods (by generic)

Slots

- +
dim

The dimensions of the variable.

@@ -207,15 +209,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Variable.html b/docs/reference/Variable.html new file mode 100644 index 00000000..32eadf30 --- /dev/null +++ b/docs/reference/Variable.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/Wrap-class.html b/docs/reference/Wrap-class.html index 3b2743d3..679c387e 100644 --- a/docs/reference/Wrap-class.html +++ b/docs/reference/Wrap-class.html @@ -1,9 +1,9 @@ -The Wrap class. — Wrap-class • CVXRThe Wrap class. — Wrap-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,47 +66,49 @@

The Wrap class.

-
# S4 method for Wrap
+    
# S4 method for class 'Wrap'
 to_numeric(object, values)
 
-# S4 method for Wrap
+# S4 method for class 'Wrap'
 dim_from_args(object)
 
-# S4 method for Wrap
+# S4 method for class 'Wrap'
 is_atom_log_log_convex(object)
 
-# S4 method for Wrap
+# S4 method for class 'Wrap'
 is_atom_log_log_concave(object)
 
-# S4 method for Wrap
+# S4 method for class 'Wrap'
 graph_implementation(object, arg_objs, dim, data = NA_real_)

Arguments

-
object
+ + +
object

A Wrap object.

-
values
+
values

A list of arguments to the atom.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Methods (by generic)

- +
  • to_numeric(Wrap): Returns the input value.

  • dim_from_args(Wrap): The dimensions of the atom.

  • is_atom_log_log_convex(Wrap): Is the atom log-log convex?

  • @@ -126,15 +128,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/Wrap.html b/docs/reference/Wrap.html new file mode 100644 index 00000000..e1ae511d --- /dev/null +++ b/docs/reference/Wrap.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/ZeroConstraint-class.html b/docs/reference/ZeroConstraint-class.html index 93a6a86a..f1a8a664 100644 --- a/docs/reference/ZeroConstraint-class.html +++ b/docs/reference/ZeroConstraint-class.html @@ -1,9 +1,9 @@ -The ZeroConstraint class — ZeroConstraint-class • CVXRThe ZeroConstraint class — ZeroConstraint-class • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,34 +66,36 @@

The ZeroConstraint class

-
# S4 method for ZeroConstraint
+    
# S4 method for class 'ZeroConstraint'
 name(x)
 
-# S4 method for ZeroConstraint
+# S4 method for class 'ZeroConstraint'
 dim(x)
 
-# S4 method for ZeroConstraint
+# S4 method for class 'ZeroConstraint'
 is_dcp(object)
 
-# S4 method for ZeroConstraint
+# S4 method for class 'ZeroConstraint'
 is_dgp(object)
 
-# S4 method for ZeroConstraint
+# S4 method for class 'ZeroConstraint'
 residual(object)
 
-# S4 method for ZeroConstraint
+# S4 method for class 'ZeroConstraint'
 canonicalize(object)

Arguments

-
x, object
+ + +
x, object

A ZeroConstraint object.

Methods (by generic)

- +
  • name(ZeroConstraint): The string representation of the constraint.

  • dim(ZeroConstraint): The dimensions of the constrained expression.

  • is_dcp(ZeroConstraint): Is the constraint DCP?

  • @@ -114,15 +116,15 @@

    Methods (by generic)

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/[,Expression,index,index,ANY-method.html b/docs/reference/[,Expression,index,index,ANY-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/[,Expression,index,index,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/[,Expression,index,matrix,ANY-method.html b/docs/reference/[,Expression,index,matrix,ANY-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/[,Expression,index,matrix,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/[,Expression,matrix,index,ANY-method.html b/docs/reference/[,Expression,matrix,index,ANY-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/[,Expression,matrix,index,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/[,Expression,matrix,matrix,ANY-method.html b/docs/reference/[,Expression,matrix,matrix,ANY-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/[,Expression,matrix,matrix,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/[,Expression,matrix,missing,ANY-method.html b/docs/reference/[,Expression,matrix,missing,ANY-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/[,Expression,matrix,missing,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/[,Expression,missing,index,ANY-method.html b/docs/reference/[,Expression,missing,index,ANY-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/[,Expression,missing,index,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/[,Expression,missing,numeric,ANY-method.html b/docs/reference/[,Expression,missing,numeric,ANY-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/[,Expression,missing,numeric,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/[,Expression,numeric,missing,ANY-method.html b/docs/reference/[,Expression,numeric,missing,ANY-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/[,Expression,numeric,missing,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/[,Expression,numeric,numeric,ANY-method.html b/docs/reference/[,Expression,numeric,numeric,ANY-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/[,Expression,numeric,numeric,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/[,Rdict,ANY,ANY,ANY-method.html b/docs/reference/[,Rdict,ANY,ANY,ANY-method.html new file mode 100644 index 00000000..aa0a0d7c --- /dev/null +++ b/docs/reference/[,Rdict,ANY,ANY,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/[,Rdictdefault,ANY,ANY,ANY-method.html b/docs/reference/[,Rdictdefault,ANY,ANY,ANY-method.html new file mode 100644 index 00000000..dd816deb --- /dev/null +++ b/docs/reference/[,Rdictdefault,ANY,ANY,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/^.html b/docs/reference/^.html new file mode 100644 index 00000000..0adf0070 --- /dev/null +++ b/docs/reference/^.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/abs.html b/docs/reference/abs.html index 00b4a663..6bc6fe74 100644 --- a/docs/reference/abs.html +++ b/docs/reference/abs.html @@ -1,122 +1,8 @@ - -Absolute Value — abs,Expression-method • CVXR - - -
-
- - - -
-
- - -
-

The elementwise absolute value.

-
- -
-
# S4 method for Expression
-abs(x)
-
- -
-

Arguments

-
x
-

An Expression.

- -
-
-

Value

- - -

An Expression representing the absolute value of the input.

-
- -
-

Examples

-
A <- Variable(2,2)
-prob <- Problem(Minimize(sum(abs(A))), list(A <= -2))
-result <- solve(prob)
-result$value
-#> [1] 8
-result$getValue(A)
-#>      [,1] [,2]
-#> [1,]   -2   -2
-#> [2,]   -2   -2
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/accepts,CBC_CONIC,Problem-method.html b/docs/reference/accepts,CBC_CONIC,Problem-method.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/accepts,CBC_CONIC,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,CPLEX_CONIC,Problem-method.html b/docs/reference/accepts,CPLEX_CONIC,Problem-method.html new file mode 100644 index 00000000..4665af60 --- /dev/null +++ b/docs/reference/accepts,CPLEX_CONIC,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,CVXOPT,Problem-method.html b/docs/reference/accepts,CVXOPT,Problem-method.html new file mode 100644 index 00000000..8a01311e --- /dev/null +++ b/docs/reference/accepts,CVXOPT,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,Chain,Problem-method.html b/docs/reference/accepts,Chain,Problem-method.html new file mode 100644 index 00000000..b79652f0 --- /dev/null +++ b/docs/reference/accepts,Chain,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,Complex2Real,Problem-method.html b/docs/reference/accepts,Complex2Real,Problem-method.html new file mode 100644 index 00000000..15645f58 --- /dev/null +++ b/docs/reference/accepts,Complex2Real,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,ConeMatrixStuffing,Problem-method.html b/docs/reference/accepts,ConeMatrixStuffing,Problem-method.html new file mode 100644 index 00000000..f162fa40 --- /dev/null +++ b/docs/reference/accepts,ConeMatrixStuffing,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,ConicSolver,Problem-method.html b/docs/reference/accepts,ConicSolver,Problem-method.html new file mode 100644 index 00000000..0143e4e5 --- /dev/null +++ b/docs/reference/accepts,ConicSolver,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,ConstantSolver,Problem-method.html b/docs/reference/accepts,ConstantSolver,Problem-method.html new file mode 100644 index 00000000..563daa80 --- /dev/null +++ b/docs/reference/accepts,ConstantSolver,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,Dcp2Cone,Problem-method.html b/docs/reference/accepts,Dcp2Cone,Problem-method.html new file mode 100644 index 00000000..36a6775f --- /dev/null +++ b/docs/reference/accepts,Dcp2Cone,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,Dgp2Dcp,Problem-method.html b/docs/reference/accepts,Dgp2Dcp,Problem-method.html new file mode 100644 index 00000000..97140cbd --- /dev/null +++ b/docs/reference/accepts,Dgp2Dcp,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,EliminatePwl,Problem-method.html b/docs/reference/accepts,EliminatePwl,Problem-method.html new file mode 100644 index 00000000..b27849cc --- /dev/null +++ b/docs/reference/accepts,EliminatePwl,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,GUROBI_CONIC,Problem-method.html b/docs/reference/accepts,GUROBI_CONIC,Problem-method.html new file mode 100644 index 00000000..f4a1f642 --- /dev/null +++ b/docs/reference/accepts,GUROBI_CONIC,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,MOSEK,Problem-method.html b/docs/reference/accepts,MOSEK,Problem-method.html new file mode 100644 index 00000000..4b67fe4e --- /dev/null +++ b/docs/reference/accepts,MOSEK,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,QpSolver,Problem-method.html b/docs/reference/accepts,QpSolver,Problem-method.html new file mode 100644 index 00000000..c0bb6587 --- /dev/null +++ b/docs/reference/accepts,QpSolver,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts,Reduction,Problem-method.html b/docs/reference/accepts,Reduction,Problem-method.html new file mode 100644 index 00000000..7befebea --- /dev/null +++ b/docs/reference/accepts,Reduction,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/accepts.html b/docs/reference/accepts.html index 1897ff70..c0a90d7e 100644 --- a/docs/reference/accepts.html +++ b/docs/reference/accepts.html @@ -1,9 +1,9 @@ -Reduction Acceptance — accepts • CVXRReduction Acceptance — accepts • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Reduction Acceptance

Arguments

-
object
+ + +
object

A Reduction object.

-
problem
+
problem

A Problem to check.

Value

- - -

A logical value indicating whether the reduction can be applied.

+

A logical value indicating whether the reduction can be applied.

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/add_to_solver_blacklist.html b/docs/reference/add_to_solver_blacklist.html new file mode 100644 index 00000000..b80eae26 --- /dev/null +++ b/docs/reference/add_to_solver_blacklist.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,Abs-method.html b/docs/reference/allow_complex,Abs-method.html new file mode 100644 index 00000000..6bc6fe74 --- /dev/null +++ b/docs/reference/allow_complex,Abs-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,AffAtom-method.html b/docs/reference/allow_complex,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/allow_complex,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,Atom-method.html b/docs/reference/allow_complex,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/allow_complex,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,LambdaSumLargest-method.html b/docs/reference/allow_complex,LambdaSumLargest-method.html new file mode 100644 index 00000000..44111716 --- /dev/null +++ b/docs/reference/allow_complex,LambdaSumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,MatrixFrac-method.html b/docs/reference/allow_complex,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/allow_complex,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,Norm1-method.html b/docs/reference/allow_complex,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/allow_complex,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,NormInf-method.html b/docs/reference/allow_complex,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/allow_complex,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,NormNuc-method.html b/docs/reference/allow_complex,NormNuc-method.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/allow_complex,NormNuc-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,Pnorm-method.html b/docs/reference/allow_complex,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/allow_complex,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,QuadForm-method.html b/docs/reference/allow_complex,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/allow_complex,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,QuadOverLin-method.html b/docs/reference/allow_complex,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/allow_complex,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/allow_complex,SigmaMax-method.html b/docs/reference/allow_complex,SigmaMax-method.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/allow_complex,SigmaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/are_args_affine.html b/docs/reference/are_args_affine.html index 841c383f..f949391c 100644 --- a/docs/reference/are_args_affine.html +++ b/docs/reference/are_args_affine.html @@ -1,9 +1,9 @@ -Are the arguments affine? — are_args_affine • CVXRAre the arguments affine? — are_args_affine • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Are the arguments affine?

Arguments

-
constraints
+ + +
constraints

A Constraint object.

Value

- - -

All the affine arguments in given constraints.

+

All the affine arguments in given constraints.

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/as.Constant.html b/docs/reference/as.Constant.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/as.Constant.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/as.character,Chain-method.html b/docs/reference/as.character,Chain-method.html new file mode 100644 index 00000000..b79652f0 --- /dev/null +++ b/docs/reference/as.character,Chain-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/as.character,Constraint-method.html b/docs/reference/as.character,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/as.character,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/as.character,ExpCone-method.html b/docs/reference/as.character,ExpCone-method.html new file mode 100644 index 00000000..ec35993c --- /dev/null +++ b/docs/reference/as.character,ExpCone-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/as.character,Expression-method.html b/docs/reference/as.character,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/as.character,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/as.character,SOC-method.html b/docs/reference/as.character,SOC-method.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/as.character,SOC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/as.character,SOCAxis-method.html b/docs/reference/as.character,SOCAxis-method.html new file mode 100644 index 00000000..07ea6c39 --- /dev/null +++ b/docs/reference/as.character,SOCAxis-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/as.character,Solution-method.html b/docs/reference/as.character,Solution-method.html new file mode 100644 index 00000000..3a141a31 --- /dev/null +++ b/docs/reference/as.character,Solution-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/as.character,Variable-method.html b/docs/reference/as.character,Variable-method.html new file mode 100644 index 00000000..32eadf30 --- /dev/null +++ b/docs/reference/as.character,Variable-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/atoms,Atom-method.html b/docs/reference/atoms,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/atoms,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/atoms,Canonical-method.html b/docs/reference/atoms,Canonical-method.html new file mode 100644 index 00000000..92de4b10 --- /dev/null +++ b/docs/reference/atoms,Canonical-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/atoms,Leaf-method.html b/docs/reference/atoms,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/atoms,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/atoms,Problem-method.html b/docs/reference/atoms,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/atoms,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/atoms.html b/docs/reference/atoms.html new file mode 100644 index 00000000..d9cc208a --- /dev/null +++ b/docs/reference/atoms.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/block_format,MOSEK-method.html b/docs/reference/block_format,MOSEK-method.html new file mode 100644 index 00000000..4b67fe4e --- /dev/null +++ b/docs/reference/block_format,MOSEK-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/bmat.html b/docs/reference/bmat.html index bb509909..f4ac59ae 100644 --- a/docs/reference/bmat.html +++ b/docs/reference/bmat.html @@ -1,9 +1,9 @@ -Block Matrix — bmat • CVXRBlock Matrix — bmat • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Block Matrix

Arguments

-
block_lists
+ + +
block_lists

A list of lists containing Expression objects, matrices, or vectors, which represent the blocks of the block matrix.

Value

- - -

An Expression representing the block matrix.

+

An Expression representing the block matrix.

@@ -106,15 +106,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/canonical_form,Canonical-method.html b/docs/reference/canonical_form,Canonical-method.html new file mode 100644 index 00000000..92de4b10 --- /dev/null +++ b/docs/reference/canonical_form,Canonical-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonical_form.html b/docs/reference/canonical_form.html new file mode 100644 index 00000000..65c40992 --- /dev/null +++ b/docs/reference/canonical_form.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,Atom-method.html b/docs/reference/canonicalize,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/canonicalize,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,Constant-method.html b/docs/reference/canonicalize,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/canonicalize,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,ExpCone-method.html b/docs/reference/canonicalize,ExpCone-method.html new file mode 100644 index 00000000..ec35993c --- /dev/null +++ b/docs/reference/canonicalize,ExpCone-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,Maximize-method.html b/docs/reference/canonicalize,Maximize-method.html new file mode 100644 index 00000000..24ee6b70 --- /dev/null +++ b/docs/reference/canonicalize,Maximize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,Minimize-method.html b/docs/reference/canonicalize,Minimize-method.html new file mode 100644 index 00000000..14d22bec --- /dev/null +++ b/docs/reference/canonicalize,Minimize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,NonPosConstraint-method.html b/docs/reference/canonicalize,NonPosConstraint-method.html new file mode 100644 index 00000000..687578bd --- /dev/null +++ b/docs/reference/canonicalize,NonPosConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,PSDConstraint-method.html b/docs/reference/canonicalize,PSDConstraint-method.html new file mode 100644 index 00000000..0f746d96 --- /dev/null +++ b/docs/reference/canonicalize,PSDConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,Parameter-method.html b/docs/reference/canonicalize,Parameter-method.html new file mode 100644 index 00000000..2f7668bf --- /dev/null +++ b/docs/reference/canonicalize,Parameter-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,Problem-method.html b/docs/reference/canonicalize,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/canonicalize,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,SOC-method.html b/docs/reference/canonicalize,SOC-method.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/canonicalize,SOC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,Variable-method.html b/docs/reference/canonicalize,Variable-method.html new file mode 100644 index 00000000..32eadf30 --- /dev/null +++ b/docs/reference/canonicalize,Variable-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize,ZeroConstraint-method.html b/docs/reference/canonicalize,ZeroConstraint-method.html new file mode 100644 index 00000000..10615fe5 --- /dev/null +++ b/docs/reference/canonicalize,ZeroConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize.html b/docs/reference/canonicalize.html index 7831c676..0ad6ab0a 100644 --- a/docs/reference/canonicalize.html +++ b/docs/reference/canonicalize.html @@ -1,9 +1,9 @@ -Canonicalize — canonicalize • CVXRCanonicalize — canonicalize • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -73,15 +73,15 @@

Canonicalize

Arguments

-
object
+ + +
object

A Canonical object.

Value

- - -

A list of list(affine expression, list(constraints)).

+

A list of list(affine expression, list(constraints)).

@@ -96,15 +96,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/canonicalize_expr,Canonicalization-method.html b/docs/reference/canonicalize_expr,Canonicalization-method.html new file mode 100644 index 00000000..2887cd44 --- /dev/null +++ b/docs/reference/canonicalize_expr,Canonicalization-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize_expr,Dgp2Dcp-method.html b/docs/reference/canonicalize_expr,Dgp2Dcp-method.html new file mode 100644 index 00000000..97140cbd --- /dev/null +++ b/docs/reference/canonicalize_expr,Dgp2Dcp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/canonicalize_tree,Canonicalization-method.html b/docs/reference/canonicalize_tree,Canonicalization-method.html new file mode 100644 index 00000000..2887cd44 --- /dev/null +++ b/docs/reference/canonicalize_tree,Canonicalization-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/cdiac.html b/docs/reference/cdiac.html index 6e3f1ada..d91d0d03 100644 --- a/docs/reference/cdiac.html +++ b/docs/reference/cdiac.html @@ -1,10 +1,10 @@ Global Monthly and Annual Temperature Anomalies (degrees C), 1850-2015 (Relative to the 1961-1990 Mean) (May 2016) — cdiac • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -138,15 +138,15 @@

References

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/complex-atoms.html b/docs/reference/complex-atoms.html index 4770f95d..9089b3ed 100644 --- a/docs/reference/complex-atoms.html +++ b/docs/reference/complex-atoms.html @@ -1,9 +1,9 @@ -Complex Numbers — complex-atoms • CVXRComplex Numbers — complex-atoms • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,27 +66,27 @@

Complex Numbers

-
# S4 method for Expression
+    
# S4 method for class 'Expression'
 Re(z)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 Im(z)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 Conj(z)

Arguments

-
z
+ + +
z

An Expression object.

Value

- - -

An Expression object that represents the real, imaginary, or complex conjugate.

+

An Expression object that represents the real, imaginary, or complex conjugate.

@@ -101,15 +101,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/complex-methods.html b/docs/reference/complex-methods.html index 784d5043..53806371 100644 --- a/docs/reference/complex-methods.html +++ b/docs/reference/complex-methods.html @@ -1,9 +1,9 @@ -Complex Properties — complex-methods • CVXRComplex Properties — complex-methods • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -75,15 +75,15 @@

Complex Properties

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A logical value.

+

A logical value.

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/cone-methods.html b/docs/reference/cone-methods.html index 09bfb0a3..e00de0b4 100644 --- a/docs/reference/cone-methods.html +++ b/docs/reference/cone-methods.html @@ -1,9 +1,9 @@ -Second-Order Cone Methods — cone-methods • CVXRSecond-Order Cone Methods — cone-methods • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -73,15 +73,15 @@

Second-Order Cone Methods

Arguments

-
object
+ + +
object

An SOCAxis object.

Value

- - -

The number of cones, or the size of a cone.

+

The number of cones, or the size of a cone.

@@ -96,15 +96,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/cone_sizes,ExpCone-method.html b/docs/reference/cone_sizes,ExpCone-method.html new file mode 100644 index 00000000..ec35993c --- /dev/null +++ b/docs/reference/cone_sizes,ExpCone-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/cone_sizes,SOC-method.html b/docs/reference/cone_sizes,SOC-method.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/cone_sizes,SOC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/cone_sizes,SOCAxis-method.html b/docs/reference/cone_sizes,SOCAxis-method.html new file mode 100644 index 00000000..07ea6c39 --- /dev/null +++ b/docs/reference/cone_sizes,SOCAxis-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/cone_sizes.html b/docs/reference/cone_sizes.html new file mode 100644 index 00000000..94602144 --- /dev/null +++ b/docs/reference/cone_sizes.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/constants,Canonical-method.html b/docs/reference/constants,Canonical-method.html new file mode 100644 index 00000000..92de4b10 --- /dev/null +++ b/docs/reference/constants,Canonical-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/constants,Constant-method.html b/docs/reference/constants,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/constants,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/constants,Leaf-method.html b/docs/reference/constants,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/constants,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/constants,Problem-method.html b/docs/reference/constants,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/constants,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/constants.html b/docs/reference/constants.html new file mode 100644 index 00000000..d9cc208a --- /dev/null +++ b/docs/reference/constants.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/constr_value,Constraint-method.html b/docs/reference/constr_value,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/constr_value,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/constr_value.html b/docs/reference/constr_value.html index 91c7aa03..ff2c4a40 100644 --- a/docs/reference/constr_value.html +++ b/docs/reference/constr_value.html @@ -1,9 +1,9 @@ -Is Constraint Violated? — constr_value • CVXRIs Constraint Violated? — constr_value • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Is Constraint Violated?

Arguments

-
object
+ + +
object

A Constraint object.

-
tolerance
+
tolerance

A numeric scalar representing the absolute tolerance to impose on the violation.

Value

- - -

A logical value indicating whether the violation is less than the tolerance. Raises an error if the residual is NA.

+

A logical value indicating whether the violation is less than the tolerance. Raises an error if the residual is NA.

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/constraints,Problem-method.html b/docs/reference/constraints,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/constraints,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/constraints.html b/docs/reference/constraints.html new file mode 100644 index 00000000..7da59899 --- /dev/null +++ b/docs/reference/constraints.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/construct_intermediate_chain-Problem-list-method.html b/docs/reference/construct_intermediate_chain-Problem-list-method.html index 94c05b97..4f2e3466 100644 --- a/docs/reference/construct_intermediate_chain-Problem-list-method.html +++ b/docs/reference/construct_intermediate_chain-Problem-list-method.html @@ -1,9 +1,9 @@ -Builds a chain that rewrites a problem into an intermediate representation suitable for numeric reductions. — construct_intermediate_chain,Problem,list-method • CVXRBuilds a chain that rewrites a problem into an intermediate representation suitable for numeric reductions. — construct_intermediate_chain,Problem,list-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,29 +66,29 @@

Builds a chain that rewrites a problem into an intermediate representation s

-
# S4 method for Problem,list
+    
# S4 method for class 'Problem,list'
 construct_intermediate_chain(problem, candidates, gp = FALSE)

Arguments

-
problem
+ + +
problem

The problem for which to build a chain.

-
candidates
+
candidates

A list of candidate solvers.

-
gp
+
gp

A logical value indicating whether the problem is a geometric program.

Value

- - -

A Chain object that can be used to convert the problem to an intermediate form.

+

A Chain object that can be used to convert the problem to an intermediate form.

@@ -103,15 +103,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/construct_solving_chain.html b/docs/reference/construct_solving_chain.html index 3e76321d..eb71754a 100644 --- a/docs/reference/construct_solving_chain.html +++ b/docs/reference/construct_solving_chain.html @@ -1,9 +1,9 @@ -Build a reduction chain from a problem to an installed solver. — construct_solving_chain • CVXRBuild a reduction chain from a problem to an installed solver. — construct_solving_chain • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Build a reduction chain from a problem to an installed solver.

Arguments

-
problem
+ + +
problem

The problem for which to build a chain.

-
candidates
+
candidates

A list of candidate solvers.

Value

- - -

A SolvingChain that can be used to solve the problem.

+

A SolvingChain that can be used to solve the problem.

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/conv.html b/docs/reference/conv.html index 48fe72de..dcfbf487 100644 --- a/docs/reference/conv.html +++ b/docs/reference/conv.html @@ -1,125 +1,8 @@ - -Discrete Convolution — conv • CVXR - - -
-
- - - -
-
- - -
-

The 1-D discrete convolution of two vectors.

-
- -
-
conv(lh_exp, rh_exp)
-
- -
-

Arguments

-
lh_exp
-

An Expression or vector representing the left-hand value.

- - -
rh_exp
-

An Expression or vector representing the right-hand value.

- -
-
-

Value

- - -

An Expression representing the convolution of the input.

-
- -
-

Examples

-
set.seed(129)
-x <- Variable(5)
-h <- matrix(stats::rnorm(2), nrow = 2, ncol = 1)
-prob <- Problem(Minimize(sum(conv(h, x))))
-result <- solve(prob)
-result$value
-#> [1] -Inf
-result$getValue(x)
-#> [1] NA
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/copy,AddExpression-method.html b/docs/reference/copy,AddExpression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/copy,AddExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/copy,GeoMean-method.html b/docs/reference/copy,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/copy,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/copy,Power-method.html b/docs/reference/copy,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/copy,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/cummax,Expression-method.html b/docs/reference/cummax,Expression-method.html new file mode 100644 index 00000000..de9a6407 --- /dev/null +++ b/docs/reference/cummax,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/cummax.html b/docs/reference/cummax.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/cummax.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/cummax_axis.html b/docs/reference/cummax_axis.html index 5072eed5..4c1115cd 100644 --- a/docs/reference/cummax_axis.html +++ b/docs/reference/cummax_axis.html @@ -1,10 +1,10 @@ Cumulative Maximum — cummax_axis • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -70,17 +70,19 @@

Cumulative Maximum

cummax_axis(expr, axis = 2)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 cummax(x)

Arguments

-
axis
+ + +
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, and 2 indicates columns. The default is 2.

-
x, expr
+
x, expr

An Expression, vector, or matrix.

@@ -124,15 +126,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/cumsum,Expression-method.html b/docs/reference/cumsum,Expression-method.html new file mode 100644 index 00000000..26e15663 --- /dev/null +++ b/docs/reference/cumsum,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/cumsum.html b/docs/reference/cumsum.html new file mode 100644 index 00000000..9d5b0806 --- /dev/null +++ b/docs/reference/cumsum.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/cumsum_axis.html b/docs/reference/cumsum_axis.html index 0db27937..68c71e75 100644 --- a/docs/reference/cumsum_axis.html +++ b/docs/reference/cumsum_axis.html @@ -1,10 +1,10 @@ Cumulative Sum — cumsum_axis • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -70,17 +70,19 @@

Cumulative Sum

cumsum_axis(expr, axis = 2)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 cumsum(x)

Arguments

-
axis
+ + +
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, and 2 indicates columns. The default is 2.

-
x, expr
+
x, expr

An Expression, vector, or matrix.

@@ -124,15 +126,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/curvature,Expression-method.html b/docs/reference/curvature,Expression-method.html new file mode 100644 index 00000000..2fc3acae --- /dev/null +++ b/docs/reference/curvature,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/curvature-atom.html b/docs/reference/curvature-atom.html index 40d4a7b9..ac5d0d67 100644 --- a/docs/reference/curvature-atom.html +++ b/docs/reference/curvature-atom.html @@ -1,9 +1,9 @@ -Curvature of an Atom — curvature-atom • CVXRCurvature of an Atom — curvature-atom • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -72,36 +72,36 @@

Curvature of an Atom

is_atom_affine(object) -# S4 method for Atom +# S4 method for class 'Atom' is_atom_convex(object) -# S4 method for Atom +# S4 method for class 'Atom' is_atom_concave(object) -# S4 method for Atom +# S4 method for class 'Atom' is_atom_affine(object) -# S4 method for Atom +# S4 method for class 'Atom' is_atom_log_log_convex(object) -# S4 method for Atom +# S4 method for class 'Atom' is_atom_log_log_concave(object) -# S4 method for Atom +# S4 method for class 'Atom' is_atom_log_log_affine(object)

Arguments

-
object
+ + +
object

A Atom object.

Value

- - -

A logical value.

+

A logical value.

@@ -140,15 +140,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/curvature-comp.html b/docs/reference/curvature-comp.html index 68ca4e58..994b70cc 100644 --- a/docs/reference/curvature-comp.html +++ b/docs/reference/curvature-comp.html @@ -1,9 +1,9 @@ -Curvature of Composition — curvature-comp • CVXRCurvature of Composition — curvature-comp • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -70,28 +70,28 @@

Curvature of Composition

is_decr(object, idx) -# S4 method for Atom +# S4 method for class 'Atom' is_incr(object, idx) -# S4 method for Atom +# S4 method for class 'Atom' is_decr(object, idx)

Arguments

-
object
+ + +
object

A Atom object.

-
idx
+
idx

An index into the atom.

Value

- - -

A logical value.

+

A logical value.

@@ -119,15 +119,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/curvature-methods.html b/docs/reference/curvature-methods.html index 23fabcef..29e2ef0c 100644 --- a/docs/reference/curvature-methods.html +++ b/docs/reference/curvature-methods.html @@ -1,9 +1,9 @@ -Curvature Properties — curvature-methods • CVXRCurvature Properties — curvature-methods • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -83,15 +83,15 @@

Curvature Properties

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A logical value.

+

A logical value.

@@ -154,15 +154,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/curvature.html b/docs/reference/curvature.html index 58673c80..1d32cb5b 100644 --- a/docs/reference/curvature.html +++ b/docs/reference/curvature.html @@ -1,10 +1,10 @@ Curvature of Expression — curvature • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -70,23 +70,21 @@

Curvature of Expression

curvature(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 curvature(object)

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A string indicating the curvature of the expression, either "CONSTANT", "AFFINE", "CONVEX, "CONCAVE", or "UNKNOWN".

- - +

A string indicating the curvature of the expression, either "CONSTANT", "AFFINE", "CONVEX, "CONCAVE", or "UNKNOWN".

A string indicating the curvature of the expression, either "CONSTANT", "AFFINE", "CONVEX", "CONCAVE", or "UNKNOWN".

@@ -119,15 +117,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/cvxr_norm.html b/docs/reference/cvxr_norm.html index 5bc5625a..bf406600 100644 --- a/docs/reference/cvxr_norm.html +++ b/docs/reference/cvxr_norm.html @@ -1,10 +1,10 @@ Matrix Norm (Alternative) — cvxr_norm • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -73,27 +73,27 @@

Matrix Norm (Alternative)

Arguments

-
x
+ + +
x

An Expression or numeric constant representing a vector or matrix.

-
p
+
p

The type of norm. May be a number (p-norm), "inf" (infinity-norm), "nuc" (nuclear norm), or "fro" (Frobenius norm). The default is p = 2.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

Value

- - -

An Expression representing the norm.

+

An Expression representing the norm.

See also

@@ -112,15 +112,15 @@

See also

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/diag.html b/docs/reference/diag.html index ced50285..a91b3a19 100644 --- a/docs/reference/diag.html +++ b/docs/reference/diag.html @@ -1,9 +1,9 @@ -Matrix Diagonal — diag,Expression-method • CVXRMatrix Diagonal — diag,Expression-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,25 +66,25 @@

Matrix Diagonal

-
# S4 method for Expression
+    
# S4 method for class 'Expression'
 diag(x = 1, nrow, ncol)

Arguments

-
x
+ + +
x

An Expression, vector, or square matrix.

-
nrow, ncol
+
nrow, ncol

(Optional) Dimensions for the result when x is not a matrix.

Value

- - -

An Expression representing the diagonal vector or matrix.

+

An Expression representing the diagonal vector or matrix.

@@ -115,15 +115,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/diff.html b/docs/reference/diff.html index 30ac5cd4..8ea35822 100644 --- a/docs/reference/diff.html +++ b/docs/reference/diff.html @@ -3,11 +3,11 @@ If x is length n, this function returns a length \(n-k\) vector of the \(k\)th order difference between the lagged terms. diff(x) returns the vector of differences between adjacent elements in the vector, i.e. [x[2] - x[1], x[3] - x[2], ...]. diff(x,1,2) is the second-order differences vector, equivalently diff(diff(x)). diff(x,1,0) returns the vector x unchanged. -diff(x,2) returns the vector of differences [x[3] - x[1], x[4] - x[2], ...], equivalent to x[(1+lag):n] - x[1:(n-lag)]."> - +
@@ -32,7 +32,7 @@
- +
@@ -74,33 +74,33 @@

Lagged and Iterated Differences

-
# S4 method for Expression
+    
# S4 method for class 'Expression'
 diff(x, lag = 1, differences = 1, ...)

Arguments

-
x
+ + +
x

An Expression.

-
lag
+
lag

An integer indicating which lag to use.

-
differences
+
differences

An integer indicating the order of the difference.

-
...
+
...

(Optional) Addition axis argument, specifying the dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is axis = 1.

Value

- - -

An Expression representing the kth order difference.

+

An Expression representing the kth order difference.

@@ -141,15 +141,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dim,Atom-method.html b/docs/reference/dim,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/dim,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim,Constant-method.html b/docs/reference/dim,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/dim,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim,Constraint-method.html b/docs/reference/dim,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/dim,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim,EqConstraint-method.html b/docs/reference/dim,EqConstraint-method.html new file mode 100644 index 00000000..9ee425a1 --- /dev/null +++ b/docs/reference/dim,EqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim,Expression-method.html b/docs/reference/dim,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/dim,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim,IneqConstraint-method.html b/docs/reference/dim,IneqConstraint-method.html new file mode 100644 index 00000000..d750b8f5 --- /dev/null +++ b/docs/reference/dim,IneqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim,Leaf-method.html b/docs/reference/dim,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/dim,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim,ZeroConstraint-method.html b/docs/reference/dim,ZeroConstraint-method.html new file mode 100644 index 00000000..10615fe5 --- /dev/null +++ b/docs/reference/dim,ZeroConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,AddExpression-method.html b/docs/reference/dim_from_args,AddExpression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/dim_from_args,AddExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Atom-method.html b/docs/reference/dim_from_args,Atom-method.html new file mode 100644 index 00000000..b432b67c --- /dev/null +++ b/docs/reference/dim_from_args,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,AxisAtom-method.html b/docs/reference/dim_from_args,AxisAtom-method.html new file mode 100644 index 00000000..276fa9c6 --- /dev/null +++ b/docs/reference/dim_from_args,AxisAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Conjugate-method.html b/docs/reference/dim_from_args,Conjugate-method.html new file mode 100644 index 00000000..2be5e9ec --- /dev/null +++ b/docs/reference/dim_from_args,Conjugate-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Conv-method.html b/docs/reference/dim_from_args,Conv-method.html new file mode 100644 index 00000000..dcfbf487 --- /dev/null +++ b/docs/reference/dim_from_args,Conv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,CumMax-method.html b/docs/reference/dim_from_args,CumMax-method.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/dim_from_args,CumMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,CumSum-method.html b/docs/reference/dim_from_args,CumSum-method.html new file mode 100644 index 00000000..9d5b0806 --- /dev/null +++ b/docs/reference/dim_from_args,CumSum-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,DiagMat-method.html b/docs/reference/dim_from_args,DiagMat-method.html new file mode 100644 index 00000000..c7ee6a1c --- /dev/null +++ b/docs/reference/dim_from_args,DiagMat-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,DiagVec-method.html b/docs/reference/dim_from_args,DiagVec-method.html new file mode 100644 index 00000000..13c5eb42 --- /dev/null +++ b/docs/reference/dim_from_args,DiagVec-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,DivExpression-method.html b/docs/reference/dim_from_args,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/dim_from_args,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Elementwise-method.html b/docs/reference/dim_from_args,Elementwise-method.html new file mode 100644 index 00000000..aff69519 --- /dev/null +++ b/docs/reference/dim_from_args,Elementwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,EyeMinusInv-method.html b/docs/reference/dim_from_args,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/dim_from_args,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,GeoMean-method.html b/docs/reference/dim_from_args,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/dim_from_args,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,HStack-method.html b/docs/reference/dim_from_args,HStack-method.html new file mode 100644 index 00000000..306a2fec --- /dev/null +++ b/docs/reference/dim_from_args,HStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Imag-method.html b/docs/reference/dim_from_args,Imag-method.html new file mode 100644 index 00000000..162e57af --- /dev/null +++ b/docs/reference/dim_from_args,Imag-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Index-method.html b/docs/reference/dim_from_args,Index-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/dim_from_args,Index-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Kron-method.html b/docs/reference/dim_from_args,Kron-method.html new file mode 100644 index 00000000..1b6e7ff6 --- /dev/null +++ b/docs/reference/dim_from_args,Kron-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,LambdaMax-method.html b/docs/reference/dim_from_args,LambdaMax-method.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/dim_from_args,LambdaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,LogDet-method.html b/docs/reference/dim_from_args,LogDet-method.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/dim_from_args,LogDet-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,MatrixFrac-method.html b/docs/reference/dim_from_args,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/dim_from_args,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,MulExpression-method.html b/docs/reference/dim_from_args,MulExpression-method.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/dim_from_args,MulExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Multiply-method.html b/docs/reference/dim_from_args,Multiply-method.html new file mode 100644 index 00000000..99f85b11 --- /dev/null +++ b/docs/reference/dim_from_args,Multiply-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,NegExpression-method.html b/docs/reference/dim_from_args,NegExpression-method.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/dim_from_args,NegExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,NormNuc-method.html b/docs/reference/dim_from_args,NormNuc-method.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/dim_from_args,NormNuc-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,OneMinusPos-method.html b/docs/reference/dim_from_args,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/dim_from_args,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,PfEigenvalue-method.html b/docs/reference/dim_from_args,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/dim_from_args,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Promote-method.html b/docs/reference/dim_from_args,Promote-method.html new file mode 100644 index 00000000..3454ffa2 --- /dev/null +++ b/docs/reference/dim_from_args,Promote-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,QuadForm-method.html b/docs/reference/dim_from_args,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/dim_from_args,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,QuadOverLin-method.html b/docs/reference/dim_from_args,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/dim_from_args,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Real-method.html b/docs/reference/dim_from_args,Real-method.html new file mode 100644 index 00000000..80f9cd35 --- /dev/null +++ b/docs/reference/dim_from_args,Real-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Reshape-method.html b/docs/reference/dim_from_args,Reshape-method.html new file mode 100644 index 00000000..cbc7c98b --- /dev/null +++ b/docs/reference/dim_from_args,Reshape-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,SigmaMax-method.html b/docs/reference/dim_from_args,SigmaMax-method.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/dim_from_args,SigmaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,SpecialIndex-method.html b/docs/reference/dim_from_args,SpecialIndex-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/dim_from_args,SpecialIndex-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,SumLargest-method.html b/docs/reference/dim_from_args,SumLargest-method.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/dim_from_args,SumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,SymbolicQuadForm-method.html b/docs/reference/dim_from_args,SymbolicQuadForm-method.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/dim_from_args,SymbolicQuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Trace-method.html b/docs/reference/dim_from_args,Trace-method.html new file mode 100644 index 00000000..4a1e58a1 --- /dev/null +++ b/docs/reference/dim_from_args,Trace-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Transpose-method.html b/docs/reference/dim_from_args,Transpose-method.html new file mode 100644 index 00000000..6d90f546 --- /dev/null +++ b/docs/reference/dim_from_args,Transpose-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,UpperTri-method.html b/docs/reference/dim_from_args,UpperTri-method.html new file mode 100644 index 00000000..0d5027f1 --- /dev/null +++ b/docs/reference/dim_from_args,UpperTri-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,VStack-method.html b/docs/reference/dim_from_args,VStack-method.html new file mode 100644 index 00000000..736da1a4 --- /dev/null +++ b/docs/reference/dim_from_args,VStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args,Wrap-method.html b/docs/reference/dim_from_args,Wrap-method.html new file mode 100644 index 00000000..e1ae511d --- /dev/null +++ b/docs/reference/dim_from_args,Wrap-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dim_from_args.html b/docs/reference/dim_from_args.html index a98d3fbc..af2eb3b1 100644 --- a/docs/reference/dim_from_args.html +++ b/docs/reference/dim_from_args.html @@ -1,9 +1,9 @@ -Atom Dimensions — dim_from_args • CVXRAtom Dimensions — dim_from_args • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,21 +68,21 @@

Atom Dimensions

dim_from_args(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 dim_from_args(object)

Arguments

-
object
+ + +
object

A Atom object.

Value

- - -

A numeric vector c(row, col) indicating the dimensions of the atom.

+

A numeric vector c(row, col) indicating the dimensions of the atom.

@@ -97,15 +97,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/domain,Atom-method.html b/docs/reference/domain,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/domain,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/domain,Expression-method.html b/docs/reference/domain,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/domain,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/domain,Leaf-method.html b/docs/reference/domain,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/domain,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/domain.html b/docs/reference/domain.html index f2de9882..462379e5 100644 --- a/docs/reference/domain.html +++ b/docs/reference/domain.html @@ -1,9 +1,9 @@ -Domain — domain • CVXRDomain — domain • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Domain

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A list of Constraint objects.

+

A list of Constraint objects.

@@ -127,15 +127,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOpVector__new.html b/docs/reference/dot-LinOpVector__new.html index 4b730b1f..aae124e8 100644 --- a/docs/reference/dot-LinOpVector__new.html +++ b/docs/reference/dot-LinOpVector__new.html @@ -1,9 +1,9 @@ -Create a new LinOpVector object. — .LinOpVector__new • CVXRCreate a new LinOpVector object. — .LinOpVector__new • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,9 +71,7 @@

Create a new LinOpVector object.

Value

- - -

an external ptr (Rcpp::XPtr) to a LinOp object instance.

+

an external ptr (Rcpp::XPtr) to a LinOp object instance.

@@ -88,15 +86,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOpVector__push_back.html b/docs/reference/dot-LinOpVector__push_back.html index fc3e8632..f118a12e 100644 --- a/docs/reference/dot-LinOpVector__push_back.html +++ b/docs/reference/dot-LinOpVector__push_back.html @@ -1,9 +1,9 @@ -Perform a push back operation on the args field of LinOp — .LinOpVector__push_back • CVXRPerform a push back operation on the args field of LinOp — .LinOpVector__push_back • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Perform a push back operation on the args field of LinOp

Arguments

-
xp
+ + +
xp

the LinOpVector Object XPtr

-
yp
+
yp

the LinOp Object XPtr to push

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__args_push_back.html b/docs/reference/dot-LinOp__args_push_back.html index f6301cce..65b9cf74 100644 --- a/docs/reference/dot-LinOp__args_push_back.html +++ b/docs/reference/dot-LinOp__args_push_back.html @@ -1,9 +1,9 @@ -Perform a push back operation on the args field of LinOp — .LinOp__args_push_back • CVXRPerform a push back operation on the args field of LinOp — .LinOp__args_push_back • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Perform a push back operation on the args field of LinOp

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

-
yp
+
yp

the LinOp Object XPtr to push

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__get_dense_data.html b/docs/reference/dot-LinOp__get_dense_data.html index 2619f43a..4622f972 100644 --- a/docs/reference/dot-LinOp__get_dense_data.html +++ b/docs/reference/dot-LinOp__get_dense_data.html @@ -1,9 +1,9 @@ -Get the field dense_data for the LinOp object — .LinOp__get_dense_data • CVXRGet the field dense_data for the LinOp object — .LinOp__get_dense_data • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the field dense_data for the LinOp object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

Value

- - -

a MatrixXd object

+

a MatrixXd object

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__get_id.html b/docs/reference/dot-LinOp__get_id.html index afe5a57d..fcc608d7 100644 --- a/docs/reference/dot-LinOp__get_id.html +++ b/docs/reference/dot-LinOp__get_id.html @@ -1,9 +1,9 @@ -Get the id field of the LinOp Object — .LinOp__get_id • CVXRGet the id field of the LinOp Object — .LinOp__get_id • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the id field of the LinOp Object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

Value

- - -

the value of the id field of the LinOp Object

+

the value of the id field of the LinOp Object

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__get_size.html b/docs/reference/dot-LinOp__get_size.html index 9dacf934..b48d6f99 100644 --- a/docs/reference/dot-LinOp__get_size.html +++ b/docs/reference/dot-LinOp__get_size.html @@ -1,9 +1,9 @@ -Get the field size for the LinOp object — .LinOp__get_size • CVXRGet the field size for the LinOp object — .LinOp__get_size • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the field size for the LinOp object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

Value

- - -

an integer vector

+

an integer vector

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__get_slice.html b/docs/reference/dot-LinOp__get_slice.html index 4b51740c..2b4873b2 100644 --- a/docs/reference/dot-LinOp__get_slice.html +++ b/docs/reference/dot-LinOp__get_slice.html @@ -1,9 +1,9 @@ -Get the slice field of the LinOp Object — .LinOp__get_slice • CVXRGet the slice field of the LinOp Object — .LinOp__get_slice • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the slice field of the LinOp Object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

Value

- - -

the value of the slice field of the LinOp Object

+

the value of the slice field of the LinOp Object

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__get_sparse.html b/docs/reference/dot-LinOp__get_sparse.html index 9f5de478..d69f986f 100644 --- a/docs/reference/dot-LinOp__get_sparse.html +++ b/docs/reference/dot-LinOp__get_sparse.html @@ -1,9 +1,9 @@ -Get the sparse flag field for the LinOp object — .LinOp__get_sparse • CVXRGet the sparse flag field for the LinOp object — .LinOp__get_sparse • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the sparse flag field for the LinOp object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

Value

- - -

TRUE or FALSE

+

TRUE or FALSE

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__get_sparse_data.html b/docs/reference/dot-LinOp__get_sparse_data.html index 16b36a9e..8bb43627 100644 --- a/docs/reference/dot-LinOp__get_sparse_data.html +++ b/docs/reference/dot-LinOp__get_sparse_data.html @@ -1,9 +1,9 @@ -Get the field named sparse_data from the LinOp object — .LinOp__get_sparse_data • CVXRGet the field named sparse_data from the LinOp object — .LinOp__get_sparse_data • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the field named sparse_data from the LinOp object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

Value

- - -

a dgCMatrix-class object

+

a dgCMatrix-class object

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__get_type.html b/docs/reference/dot-LinOp__get_type.html index bc5cd62f..a242f4e5 100644 --- a/docs/reference/dot-LinOp__get_type.html +++ b/docs/reference/dot-LinOp__get_type.html @@ -1,9 +1,9 @@ -Get the field named type for the LinOp object — .LinOp__get_type • CVXRGet the field named type for the LinOp object — .LinOp__get_type • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the field named type for the LinOp object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

Value

- - -

an integer value for type

+

an integer value for type

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__new.html b/docs/reference/dot-LinOp__new.html index 261d6e1f..6dcadbb5 100644 --- a/docs/reference/dot-LinOp__new.html +++ b/docs/reference/dot-LinOp__new.html @@ -1,9 +1,9 @@ -Create a new LinOp object. — .LinOp__new • CVXRCreate a new LinOp object. — .LinOp__new • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,9 +71,7 @@

Create a new LinOp object.

Value

- - -

an external ptr (Rcpp::XPtr) to a LinOp object instance.

+

an external ptr (Rcpp::XPtr) to a LinOp object instance.

@@ -88,15 +86,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__set_dense_data.html b/docs/reference/dot-LinOp__set_dense_data.html index b9e0c5f1..1651d814 100644 --- a/docs/reference/dot-LinOp__set_dense_data.html +++ b/docs/reference/dot-LinOp__set_dense_data.html @@ -1,9 +1,9 @@ -Set the field dense_data of the LinOp object — .LinOp__set_dense_data • CVXRSet the field dense_data of the LinOp object — .LinOp__set_dense_data • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the field dense_data of the LinOp object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

-
denseMat
+
denseMat

a standard matrix object in R

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__set_size.html b/docs/reference/dot-LinOp__set_size.html index 3bbf56d7..20858704 100644 --- a/docs/reference/dot-LinOp__set_size.html +++ b/docs/reference/dot-LinOp__set_size.html @@ -1,9 +1,9 @@ -Set the field size of the LinOp object — .LinOp__set_size • CVXRSet the field size of the LinOp object — .LinOp__set_size • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the field size of the LinOp object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

-
value
+
value

an integer vector object in R

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__set_slice.html b/docs/reference/dot-LinOp__set_slice.html index ec048774..79d052f9 100644 --- a/docs/reference/dot-LinOp__set_slice.html +++ b/docs/reference/dot-LinOp__set_slice.html @@ -1,9 +1,9 @@ -Set the slice field of the LinOp Object — .LinOp__set_slice • CVXRSet the slice field of the LinOp Object — .LinOp__set_slice • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Set the slice field of the LinOp Object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

-
value
+
value

a list of integer vectors, e.g. list(1:10, 2L, 11:15)

Value

- - -

the value of the slice field of the LinOp Object

+

the value of the slice field of the LinOp Object

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__set_sparse.html b/docs/reference/dot-LinOp__set_sparse.html index 9c0ebca2..46e5ab0d 100644 --- a/docs/reference/dot-LinOp__set_sparse.html +++ b/docs/reference/dot-LinOp__set_sparse.html @@ -1,9 +1,9 @@ -Set the flag sparse of the LinOp object — .LinOp__set_sparse • CVXRSet the flag sparse of the LinOp object — .LinOp__set_sparse • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the flag sparse of the LinOp object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

-
sparseSEXP
+
sparseSEXP

an R boolean

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__set_sparse_data.html b/docs/reference/dot-LinOp__set_sparse_data.html index a5f68a42..5bec5cb9 100644 --- a/docs/reference/dot-LinOp__set_sparse_data.html +++ b/docs/reference/dot-LinOp__set_sparse_data.html @@ -1,9 +1,9 @@ -Set the field named sparse_data of the LinOp object — .LinOp__set_sparse_data • CVXRSet the field named sparse_data of the LinOp object — .LinOp__set_sparse_data • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the field named sparse_data of the LinOp object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

-
sparseMat
+
sparseMat

a dgCMatrix-class object

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__set_type.html b/docs/reference/dot-LinOp__set_type.html index 83354f60..fc4b3f19 100644 --- a/docs/reference/dot-LinOp__set_type.html +++ b/docs/reference/dot-LinOp__set_type.html @@ -1,9 +1,9 @@ -Set the field named type for the LinOp object — .LinOp__set_type • CVXRSet the field named type for the LinOp object — .LinOp__set_type • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the field named type for the LinOp object

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

-
typeValue
+
typeValue

an integer value

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__size_push_back.html b/docs/reference/dot-LinOp__size_push_back.html index 42462ade..cf0a41f3 100644 --- a/docs/reference/dot-LinOp__size_push_back.html +++ b/docs/reference/dot-LinOp__size_push_back.html @@ -1,9 +1,9 @@ -Perform a push back operation on the size field of LinOp — .LinOp__size_push_back • CVXRPerform a push back operation on the size field of LinOp — .LinOp__size_push_back • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Perform a push back operation on the size field of LinOp

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

-
intVal
+
intVal

the integer value to push back

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp__slice_push_back.html b/docs/reference/dot-LinOp__slice_push_back.html index e5abca0c..e47decbf 100644 --- a/docs/reference/dot-LinOp__slice_push_back.html +++ b/docs/reference/dot-LinOp__slice_push_back.html @@ -1,9 +1,9 @@ -Perform a push back operation on the slice field of LinOp — .LinOp__slice_push_back • CVXRPerform a push back operation on the slice field of LinOp — .LinOp__slice_push_back • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Perform a push back operation on the slice field of LinOp

Arguments

-
xp
+ + +
xp

the LinOp Object XPtr

-
intVec
+
intVec

an integer vector to push back

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-LinOp_at_index.html b/docs/reference/dot-LinOp_at_index.html index 2614c0fd..a4a3d46d 100644 --- a/docs/reference/dot-LinOp_at_index.html +++ b/docs/reference/dot-LinOp_at_index.html @@ -1,9 +1,9 @@ -Return the LinOp element at index i (0-based) — .LinOp_at_index • CVXRReturn the LinOp element at index i (0-based) — .LinOp_at_index • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Return the LinOp element at index i (0-based)

Arguments

-
lvec
+ + +
lvec

the LinOpVector Object XPtr

-
i
+
i

the index

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__get_I.html b/docs/reference/dot-ProblemData__get_I.html index d7df50b4..1ecddf72 100644 --- a/docs/reference/dot-ProblemData__get_I.html +++ b/docs/reference/dot-ProblemData__get_I.html @@ -1,9 +1,9 @@ -Get the I field of the ProblemData Object — .ProblemData__get_I • CVXRGet the I field of the ProblemData Object — .ProblemData__get_I • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the I field of the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

Value

- - -

an integer vector of the field I from the ProblemData Object

+

an integer vector of the field I from the ProblemData Object

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__get_J.html b/docs/reference/dot-ProblemData__get_J.html index 13e622de..3ae555fe 100644 --- a/docs/reference/dot-ProblemData__get_J.html +++ b/docs/reference/dot-ProblemData__get_J.html @@ -1,9 +1,9 @@ -Get the J field of the ProblemData Object — .ProblemData__get_J • CVXRGet the J field of the ProblemData Object — .ProblemData__get_J • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the J field of the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

Value

- - -

an integer vector of the field J from the ProblemData Object

+

an integer vector of the field J from the ProblemData Object

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__get_V.html b/docs/reference/dot-ProblemData__get_V.html index 26f9460d..ab962c9d 100644 --- a/docs/reference/dot-ProblemData__get_V.html +++ b/docs/reference/dot-ProblemData__get_V.html @@ -1,9 +1,9 @@ -Get the V field of the ProblemData Object — .ProblemData__get_V • CVXRGet the V field of the ProblemData Object — .ProblemData__get_V • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the V field of the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

Value

- - -

a numeric vector of doubles (the field V) from the ProblemData Object

+

a numeric vector of doubles (the field V) from the ProblemData Object

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__get_const_to_row.html b/docs/reference/dot-ProblemData__get_const_to_row.html index c84b4cc9..5f5b88a9 100644 --- a/docs/reference/dot-ProblemData__get_const_to_row.html +++ b/docs/reference/dot-ProblemData__get_const_to_row.html @@ -1,9 +1,9 @@ -Get the const_to_row field of the ProblemData Object — .ProblemData__get_const_to_row • CVXRGet the const_to_row field of the ProblemData Object — .ProblemData__get_const_to_row • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the const_to_row field of the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

Value

- - -

the const_to_row field as a named integer vector where the names are integers converted to characters

+

the const_to_row field as a named integer vector where the names are integers converted to characters

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__get_const_vec.html b/docs/reference/dot-ProblemData__get_const_vec.html index 31d9c933..d31bb1c5 100644 --- a/docs/reference/dot-ProblemData__get_const_vec.html +++ b/docs/reference/dot-ProblemData__get_const_vec.html @@ -1,9 +1,9 @@ -Get the const_vec field from the ProblemData Object — .ProblemData__get_const_vec • CVXRGet the const_vec field from the ProblemData Object — .ProblemData__get_const_vec • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the const_vec field from the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

Value

- - -

a numeric vector of the field const_vec from the ProblemData Object

+

a numeric vector of the field const_vec from the ProblemData Object

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__get_id_to_col.html b/docs/reference/dot-ProblemData__get_id_to_col.html index 05923389..c5240fbc 100644 --- a/docs/reference/dot-ProblemData__get_id_to_col.html +++ b/docs/reference/dot-ProblemData__get_id_to_col.html @@ -1,9 +1,9 @@ -Get the id_to_col field of the ProblemData Object — .ProblemData__get_id_to_col • CVXRGet the id_to_col field of the ProblemData Object — .ProblemData__get_id_to_col • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get the id_to_col field of the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

Value

- - -

the id_to_col field as a named integer vector where the names are integers converted to characters

+

the id_to_col field as a named integer vector where the names are integers converted to characters

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__new.html b/docs/reference/dot-ProblemData__new.html index 39a6b1eb..8f7ecd99 100644 --- a/docs/reference/dot-ProblemData__new.html +++ b/docs/reference/dot-ProblemData__new.html @@ -1,9 +1,9 @@ -Create a new ProblemData object. — .ProblemData__new • CVXRCreate a new ProblemData object. — .ProblemData__new • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,9 +71,7 @@

Create a new ProblemData object.

Value

- - -

an external ptr (Rcpp::XPtr) to a ProblemData object instance.

+

an external ptr (Rcpp::XPtr) to a ProblemData object instance.

@@ -88,15 +86,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__set_I.html b/docs/reference/dot-ProblemData__set_I.html index d7402b9f..998d5d6e 100644 --- a/docs/reference/dot-ProblemData__set_I.html +++ b/docs/reference/dot-ProblemData__set_I.html @@ -1,9 +1,9 @@ -Set the I field in the ProblemData Object — .ProblemData__set_I • CVXRSet the I field in the ProblemData Object — .ProblemData__set_I • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the I field in the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

-
ip
+
ip

an integer vector of values for field I of the ProblemData object

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__set_J.html b/docs/reference/dot-ProblemData__set_J.html index cea7534a..bec5f7a4 100644 --- a/docs/reference/dot-ProblemData__set_J.html +++ b/docs/reference/dot-ProblemData__set_J.html @@ -1,9 +1,9 @@ -Set the J field in the ProblemData Object — .ProblemData__set_J • CVXRSet the J field in the ProblemData Object — .ProblemData__set_J • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the J field in the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

-
jp
+
jp

an integer vector of the values for field J of the ProblemData object

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__set_V.html b/docs/reference/dot-ProblemData__set_V.html index 6f133712..e8b41df3 100644 --- a/docs/reference/dot-ProblemData__set_V.html +++ b/docs/reference/dot-ProblemData__set_V.html @@ -1,9 +1,9 @@ -Set the V field in the ProblemData Object — .ProblemData__set_V • CVXRSet the V field in the ProblemData Object — .ProblemData__set_V • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the V field in the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

-
vp
+
vp

a numeric vector of values for field V

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__set_const_to_row.html b/docs/reference/dot-ProblemData__set_const_to_row.html index 114808f8..6e745e4e 100644 --- a/docs/reference/dot-ProblemData__set_const_to_row.html +++ b/docs/reference/dot-ProblemData__set_const_to_row.html @@ -1,9 +1,9 @@ -Set the const_to_row map of the ProblemData Object — .ProblemData__set_const_to_row • CVXRSet the const_to_row map of the ProblemData Object — .ProblemData__set_const_to_row • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the const_to_row map of the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

-
iv
+
iv

a named integer vector with names being integers converted to characters

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__set_const_vec.html b/docs/reference/dot-ProblemData__set_const_vec.html index a6a1ef8c..edf4c756 100644 --- a/docs/reference/dot-ProblemData__set_const_vec.html +++ b/docs/reference/dot-ProblemData__set_const_vec.html @@ -1,9 +1,9 @@ -Set the const_vec field in the ProblemData Object — .ProblemData__set_const_vec • CVXRSet the const_vec field in the ProblemData Object — .ProblemData__set_const_vec • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the const_vec field in the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

-
cvp
+
cvp

a numeric vector of values for const_vec field of the ProblemData object

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-ProblemData__set_id_to_col.html b/docs/reference/dot-ProblemData__set_id_to_col.html index cdf5b0f2..fcc17df0 100644 --- a/docs/reference/dot-ProblemData__set_id_to_col.html +++ b/docs/reference/dot-ProblemData__set_id_to_col.html @@ -1,9 +1,9 @@ -Set the id_to_col field of the ProblemData Object — .ProblemData__set_id_to_col • CVXRSet the id_to_col field of the ProblemData Object — .ProblemData__set_id_to_col • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,11 +71,13 @@

Set the id_to_col field of the ProblemData Object

Arguments

-
xp
+ + +
xp

the ProblemData Object XPtr

-
iv
+
iv

a named integer vector with names being integers converted to characters

@@ -92,15 +94,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-build_matrix_0.html b/docs/reference/dot-build_matrix_0.html index a9488cfd..9e12ace3 100644 --- a/docs/reference/dot-build_matrix_0.html +++ b/docs/reference/dot-build_matrix_0.html @@ -1,9 +1,9 @@ -Get the sparse flag field for the LinOp object — .build_matrix_0 • CVXRGet the sparse flag field for the LinOp object — .build_matrix_0 • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Get the sparse flag field for the LinOp object

Arguments

-
xp
+ + +
xp

the LinOpVector Object XPtr

-
v
+
v

the id_to_col named int vector in R with integer names

Value

- - -

a XPtr to ProblemData Object

+

a XPtr to ProblemData Object

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-build_matrix_1.html b/docs/reference/dot-build_matrix_1.html index db44b1de..3cac510c 100644 --- a/docs/reference/dot-build_matrix_1.html +++ b/docs/reference/dot-build_matrix_1.html @@ -1,9 +1,9 @@ -Get the sparse flag field for the LinOp object — .build_matrix_1 • CVXRGet the sparse flag field for the LinOp object — .build_matrix_1 • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Get the sparse flag field for the LinOp object

Arguments

-
xp
+ + +
xp

the LinOpVector Object XPtr

-
v1
+
v1

the id_to_col named int vector in R with integer names

-
v2
+
v2

the constr_offsets vector of offsets (an int vector in R)

Value

- - -

a XPtr to ProblemData Object

+

a XPtr to ProblemData Object

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-decomp_quad.html b/docs/reference/dot-decomp_quad.html index f7255ae2..9f3f44b1 100644 --- a/docs/reference/dot-decomp_quad.html +++ b/docs/reference/dot-decomp_quad.html @@ -1,9 +1,9 @@ -Compute a Matrix Decomposition. — .decomp_quad • CVXRCompute a Matrix Decomposition. — .decomp_quad • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Compute a Matrix Decomposition.

Arguments

-
P
+ + +
P

A real symmetric positive or negative (semi)definite input matrix

-
cond
+
cond

Cutoff for small eigenvalues. Singular values smaller than rcond * largest_eigenvalue are considered negligible.

-
rcond
+
rcond

Cutoff for small eigenvalues. Singular values smaller than rcond * largest_eigenvalue are considered negligible.

Value

- - -

A list consisting of induced matrix 2-norm of P and a rectangular matrix such that P = scale * (dot(M1, t(M1)) - dot(M2, t(M2)))

+

A list consisting of induced matrix 2-norm of P and a rectangular matrix such that P = scale * (dot(M1, t(M1)) - dot(M2, t(M2)))

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dot-p_norm.html b/docs/reference/dot-p_norm.html index 4ff9e3f1..64747fe5 100644 --- a/docs/reference/dot-p_norm.html +++ b/docs/reference/dot-p_norm.html @@ -1,9 +1,9 @@ -Internal method for calculating the p-norm — .p_norm • CVXRInternal method for calculating the p-norm — .p_norm • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Internal method for calculating the p-norm

Arguments

-
x
+ + +
x

A matrix

-
p
+
p

A number grater than or equal to 1, or equal to positive infinity

Value

- - -

Returns the specified norm of matrix x

+

Returns the specified norm of matrix x

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dspop.html b/docs/reference/dspop.html index e533fda4..e8fdf0af 100644 --- a/docs/reference/dspop.html +++ b/docs/reference/dspop.html @@ -1,11 +1,11 @@ Direct Standardization: Population — dspop • CVXR - +
@@ -30,7 +30,7 @@
- +
@@ -103,15 +103,15 @@

See also

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dssamp.html b/docs/reference/dssamp.html index e96ca5c8..7430f8ea 100644 --- a/docs/reference/dssamp.html +++ b/docs/reference/dssamp.html @@ -1,10 +1,10 @@ Direct Standardization: Sample — dssamp • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -101,15 +101,15 @@

See also

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dual_value,Constraint-method.html b/docs/reference/dual_value,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/dual_value,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/dual_value-methods.html b/docs/reference/dual_value-methods.html index 6f022239..5700e85d 100644 --- a/docs/reference/dual_value-methods.html +++ b/docs/reference/dual_value-methods.html @@ -1,9 +1,9 @@ -Get and Set Dual Value — dual_value-methods • CVXRGet and Set Dual Value — dual_value-methods • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -73,11 +73,13 @@

Get and Set Dual Value

Arguments

-
object
+ + +
object

A Constraint object.

-
value
+
value

A numeric scalar, vector, or matrix to assign to the object.

@@ -94,15 +96,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/dual_value.html b/docs/reference/dual_value.html new file mode 100644 index 00000000..51264024 --- /dev/null +++ b/docs/reference/dual_value.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/entr.html b/docs/reference/entr.html index e6164b83..2d645861 100644 --- a/docs/reference/entr.html +++ b/docs/reference/entr.html @@ -1,123 +1,8 @@ - -Entropy Function — entr • CVXR - - -
-
- - - -
-
- - -
-

The elementwise entropy function, \(-xlog(x)\).

-
- -
-
entr(x)
-
- -
-

Arguments

-
x
-

An Expression, vector, or matrix.

- -
-
-

Value

- - -

An Expression representing the entropy of the input.

-
- -
-

Examples

-
x <- Variable(5)
-obj <- Maximize(sum(entr(x)))
-prob <- Problem(obj, list(sum(x) == 1))
-result <- solve(prob)
-result$getValue(x)
-#>      [,1]
-#> [1,]  0.2
-#> [2,]  0.2
-#> [3,]  0.2
-#> [4,]  0.2
-#> [5,]  0.2
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/entropy.html b/docs/reference/entropy.html new file mode 100644 index 00000000..d38cd6ec --- /dev/null +++ b/docs/reference/entropy.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/exp.html b/docs/reference/exp.html index 497ce4b4..ddba19b6 100644 --- a/docs/reference/exp.html +++ b/docs/reference/exp.html @@ -1,124 +1,8 @@ - -Natural Exponential — exp,Expression-method • CVXR - - -
-
- - - -
-
- - -
-

The elementwise natural exponential.

-
- -
-
# S4 method for Expression
-exp(x)
-
- -
-

Arguments

-
x
-

An Expression.

- -
-
-

Value

- - -

An Expression representing the natural exponential of the input.

-
- -
-

Examples

-
x <- Variable(5)
-obj <- Minimize(sum(exp(x)))
-prob <- Problem(obj, list(sum(x) == 1))
-result <- solve(prob)
-result$getValue(x)
-#>      [,1]
-#> [1,]  0.2
-#> [2,]  0.2
-#> [3,]  0.2
-#> [4,]  0.2
-#> [5,]  0.2
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/expr,Canonical-method.html b/docs/reference/expr,Canonical-method.html new file mode 100644 index 00000000..92de4b10 --- /dev/null +++ b/docs/reference/expr,Canonical-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/expr,EqConstraint-method.html b/docs/reference/expr,EqConstraint-method.html new file mode 100644 index 00000000..9ee425a1 --- /dev/null +++ b/docs/reference/expr,EqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/expr,Expression-method.html b/docs/reference/expr,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/expr,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/expr,IneqConstraint-method.html b/docs/reference/expr,IneqConstraint-method.html new file mode 100644 index 00000000..d750b8f5 --- /dev/null +++ b/docs/reference/expr,IneqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/expression-parts.html b/docs/reference/expression-parts.html index 28217a69..dfb3ae26 100644 --- a/docs/reference/expression-parts.html +++ b/docs/reference/expression-parts.html @@ -1,9 +1,9 @@ -Parts of an Expression Leaf — expression-parts • CVXRParts of an Expression Leaf — expression-parts • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -77,15 +77,15 @@

Parts of an Expression Leaf

Arguments

-
object
+ + +
object

A Leaf object.

Value

- - -

A list of Variable, Parameter, Constant, or Atom objects.

+

A list of Variable, Parameter, Constant, or Atom objects.

@@ -289,15 +289,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/extract_dual_value.html b/docs/reference/extract_dual_value.html index 95f3f41d..51e95c7f 100644 --- a/docs/reference/extract_dual_value.html +++ b/docs/reference/extract_dual_value.html @@ -1,9 +1,9 @@ -Gets a specified value of a dual variable. — extract_dual_value • CVXRGets a specified value of a dual variable. — extract_dual_value • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Gets a specified value of a dual variable.

Arguments

-
result_vec
+ + +
result_vec

A vector containing the dual variable values.

-
offset
+
offset

An offset to get correct index of dual values.

-
constraint
+
constraint

A list of the constraints in the problem.

Value

- - -

A list of a dual variable value and its offset.

+

A list of a dual variable value and its offset.

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/extract_mip_idx.html b/docs/reference/extract_mip_idx.html index afbbc5da..e99340dc 100644 --- a/docs/reference/extract_mip_idx.html +++ b/docs/reference/extract_mip_idx.html @@ -1,9 +1,9 @@ -Coalesces bool, int indices for variables. — extract_mip_idx • CVXRCoalesces bool, int indices for variables. — extract_mip_idx • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Coalesces bool, int indices for variables.

Arguments

-
variables
+ + +
variables

A list of Variable objects.

Value

- - -

Coalesces bool, int indices for variables. The indexing scheme assumes that the variables will be coalesced into +

Coalesces bool, int indices for variables. The indexing scheme assumes that the variables will be coalesced into a single one-dimensional variable, with each variable being reshaped in Fortran order.

@@ -95,15 +95,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/eye_minus_inv.html b/docs/reference/eye_minus_inv.html index b2c4c6d6..c9a56d89 100644 --- a/docs/reference/eye_minus_inv.html +++ b/docs/reference/eye_minus_inv.html @@ -1,10 +1,10 @@ Unity Resolvent — eye_minus_inv • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -73,15 +73,15 @@

Unity Resolvent

Arguments

-
X
+ + +
X

An Expression or positive square matrix.

Value

- - -

An Expression representing the unity resolvent of the input.

+

An Expression representing the unity resolvent of the input.

Details

@@ -111,15 +111,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/flatten,Expression-method.html b/docs/reference/flatten,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/flatten,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/format_constr,SOC-method.html b/docs/reference/format_constr,SOC-method.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/format_constr,SOC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/format_constr,SOCAxis-method.html b/docs/reference/format_constr,SOCAxis-method.html new file mode 100644 index 00000000..07ea6c39 --- /dev/null +++ b/docs/reference/format_constr,SOCAxis-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/format_constr.html b/docs/reference/format_constr.html index eb1c699c..2462ab69 100644 --- a/docs/reference/format_constr.html +++ b/docs/reference/format_constr.html @@ -1,9 +1,9 @@ -Format Constraints — format_constr • CVXRFormat Constraints — format_constr • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,31 +71,31 @@

Format Constraints

Arguments

-
object
+ + +
object

A Constraint object.

-
eq_constr
+
eq_constr

A list of the equality constraints in the canonical problem.

-
leq_constr
+
leq_constr

A list of the inequality constraints in the canonical problem.

-
dims
+
dims

A list with the dimensions of the conic constraints.

-
solver
+
solver

A string representing the solver to be called.

Value

- - -

A list containing equality constraints, inequality constraints, and dimensions.

+

A list containing equality constraints, inequality constraints, and dimensions.

@@ -110,15 +110,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/geo_mean.html b/docs/reference/geo_mean.html index 272de49c..a6cc67f9 100644 --- a/docs/reference/geo_mean.html +++ b/docs/reference/geo_mean.html @@ -1,9 +1,9 @@ -Geometric Mean — geo_mean • CVXRGeometric Mean — geo_mean • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Geometric Mean

Arguments

-
x
+ + +
x

An Expression or vector.

-
p
+
p

(Optional) A vector of weights for the weighted geometric mean. Defaults to a vector of ones, giving the unweighted geometric mean \(x_1^{1/n} \cdots x_n^{1/n}\).

-
max_denom
+
max_denom

(Optional) The maximum denominator to use in approximating p/sum(p) with w. If w is not an exact representation, increasing max_denom may offer a more accurate representation, at the cost of requiring more convex inequalities to represent the geometric mean. Defaults to 1024.

Value

- - -

An Expression representing the geometric mean of the input.

+

An Expression representing the geometric mean of the input.

Details

@@ -110,14 +110,14 @@

Examples

#> [1,] 0.5 #> [2,] 0.5 -if (FALSE) { +if (FALSE) { # \dontrun{ x <- Variable(5) p <- c(0.07, 0.12, 0.23, 0.19, 0.39) prob <- Problem(Maximize(geo_mean(x,p)), list(p_norm(x) <= 1)) result <- solve(prob) result$value result$getValue(x) -} +} # }
@@ -132,15 +132,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/get_data,AxisAtom-method.html b/docs/reference/get_data,AxisAtom-method.html new file mode 100644 index 00000000..276fa9c6 --- /dev/null +++ b/docs/reference/get_data,AxisAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Canonical-method.html b/docs/reference/get_data,Canonical-method.html new file mode 100644 index 00000000..92de4b10 --- /dev/null +++ b/docs/reference/get_data,Canonical-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Constraint-method.html b/docs/reference/get_data,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/get_data,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,CumMax-method.html b/docs/reference/get_data,CumMax-method.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/get_data,CumMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,CumSum-method.html b/docs/reference/get_data,CumSum-method.html new file mode 100644 index 00000000..9d5b0806 --- /dev/null +++ b/docs/reference/get_data,CumSum-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,GeoMean-method.html b/docs/reference/get_data,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/get_data,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Huber-method.html b/docs/reference/get_data,Huber-method.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/get_data,Huber-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Index-method.html b/docs/reference/get_data,Index-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/get_data,Index-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,LambdaSumLargest-method.html b/docs/reference/get_data,LambdaSumLargest-method.html new file mode 100644 index 00000000..44111716 --- /dev/null +++ b/docs/reference/get_data,LambdaSumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Leaf-method.html b/docs/reference/get_data,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/get_data,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Norm1-method.html b/docs/reference/get_data,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/get_data,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,NormInf-method.html b/docs/reference/get_data,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/get_data,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Parameter-method.html b/docs/reference/get_data,Parameter-method.html new file mode 100644 index 00000000..2f7668bf --- /dev/null +++ b/docs/reference/get_data,Parameter-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Pnorm-method.html b/docs/reference/get_data,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/get_data,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Power-method.html b/docs/reference/get_data,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/get_data,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Promote-method.html b/docs/reference/get_data,Promote-method.html new file mode 100644 index 00000000..3454ffa2 --- /dev/null +++ b/docs/reference/get_data,Promote-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Reshape-method.html b/docs/reference/get_data,Reshape-method.html new file mode 100644 index 00000000..cbc7c98b --- /dev/null +++ b/docs/reference/get_data,Reshape-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,SOC-method.html b/docs/reference/get_data,SOC-method.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/get_data,SOC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,SpecialIndex-method.html b/docs/reference/get_data,SpecialIndex-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/get_data,SpecialIndex-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,SumLargest-method.html b/docs/reference/get_data,SumLargest-method.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/get_data,SumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,SymbolicQuadForm-method.html b/docs/reference/get_data,SymbolicQuadForm-method.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/get_data,SymbolicQuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data,Transpose-method.html b/docs/reference/get_data,Transpose-method.html new file mode 100644 index 00000000..6d90f546 --- /dev/null +++ b/docs/reference/get_data,Transpose-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_data.html b/docs/reference/get_data.html index cbeb18c5..c361d8b6 100644 --- a/docs/reference/get_data.html +++ b/docs/reference/get_data.html @@ -1,9 +1,9 @@ -Get Expression Data — get_data • CVXRGet Expression Data — get_data • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Get Expression Data

Arguments

-
object
+ + +
object

A Expression object.

Value

- - -

A list containing data.

+

A list containing data.

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/get_dual_values.html b/docs/reference/get_dual_values.html index aaa2eb2b..7b0257f9 100644 --- a/docs/reference/get_dual_values.html +++ b/docs/reference/get_dual_values.html @@ -1,9 +1,9 @@ -Gets the values of the dual variables. — get_dual_values • CVXRGets the values of the dual variables. — get_dual_values • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Gets the values of the dual variables.

Arguments

-
result_vec
+ + +
result_vec

A vector containing the dual variable values.

-
parse_func
+
parse_func

Function handle for the parser.

-
constraints
+
constraints

A list of the constraints in the problem.

Value

- - -

A map of constraint ID to dual variable value.

+

A map of constraint ID to dual variable value.

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/get_id.html b/docs/reference/get_id.html index 50fe2e3f..98572f14 100644 --- a/docs/reference/get_id.html +++ b/docs/reference/get_id.html @@ -1,9 +1,9 @@ -Get ID — get_id • CVXRGet ID — get_id • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,16 +71,14 @@

Get ID

Value

- - -

A new unique integer identifier.

+

A new unique integer identifier.

Examples

-
if (FALSE) {
+    
if (FALSE) { # \dontrun{
    get_id()
-}
+} # }
 
@@ -95,15 +93,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/get_np.html b/docs/reference/get_np.html index 9b2556c5..158bdca8 100644 --- a/docs/reference/get_np.html +++ b/docs/reference/get_np.html @@ -1,9 +1,9 @@ -Get numpy handle — get_np • CVXRGet numpy handle — get_np • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,16 +71,14 @@

Get numpy handle

Value

- - -

the numpy handle

+

the numpy handle

Examples

-
if (FALSE) {
+    
if (FALSE) { # \dontrun{
    get_np
-}
+} # }
 
@@ -95,15 +93,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/get_problem_data,Problem,character,logical-method.html b/docs/reference/get_problem_data,Problem,character,logical-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/get_problem_data,Problem,character,logical-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_problem_data,Problem,character,missing-method.html b/docs/reference/get_problem_data,Problem,character,missing-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/get_problem_data,Problem,character,missing-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/get_problem_data.html b/docs/reference/get_problem_data.html index d881ced1..834fe4fe 100644 --- a/docs/reference/get_problem_data.html +++ b/docs/reference/get_problem_data.html @@ -1,9 +1,9 @@ -Get Problem Data — get_problem_data • CVXRGet Problem Data — get_problem_data • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Get Problem Data

Arguments

-
object
+ + +
object

A Problem object.

-
solver
+
solver

A string indicating the solver that the problem data is for. Call installed_solvers() to see all available.

-
gp
+
gp

(Optional) A logical value indicating whether the problem is a geometric program.

Value

- - -

A list containing the data for the solver, the solving chain for the problem, and the inverse data needed to invert the solution.

+

A list containing the data for the solver, the solving chain for the problem, and the inverse data needed to invert the solution.

@@ -172,15 +172,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/get_sp.html b/docs/reference/get_sp.html index fcb940e6..ce9b198a 100644 --- a/docs/reference/get_sp.html +++ b/docs/reference/get_sp.html @@ -1,9 +1,9 @@ -Get scipy handle — get_sp • CVXRGet scipy handle — get_sp • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,16 +71,14 @@

Get scipy handle

Value

- - -

the scipy handle

+

the scipy handle

Examples

-
if (FALSE) {
+    
if (FALSE) { # \dontrun{
    get_sp
-}
+} # }
 
@@ -95,15 +93,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/grad,Atom-method.html b/docs/reference/grad,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/grad,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/grad,Constant-method.html b/docs/reference/grad,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/grad,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/grad,Expression-method.html b/docs/reference/grad,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/grad,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/grad,Parameter-method.html b/docs/reference/grad,Parameter-method.html new file mode 100644 index 00000000..2f7668bf --- /dev/null +++ b/docs/reference/grad,Parameter-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/grad,Variable-method.html b/docs/reference/grad,Variable-method.html new file mode 100644 index 00000000..32eadf30 --- /dev/null +++ b/docs/reference/grad,Variable-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/grad.html b/docs/reference/grad.html index 15dc9229..ecb97b16 100644 --- a/docs/reference/grad.html +++ b/docs/reference/grad.html @@ -1,10 +1,10 @@ Sub/Super-Gradient — grad • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -73,15 +73,15 @@

Sub/Super-Gradient

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A list mapping each variable to a sparse matrix.

+

A list mapping each variable to a sparse matrix.

@@ -131,15 +131,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/graph_implementation,AddExpression-method.html b/docs/reference/graph_implementation,AddExpression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/graph_implementation,AddExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,Atom-method.html b/docs/reference/graph_implementation,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/graph_implementation,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,Conv-method.html b/docs/reference/graph_implementation,Conv-method.html new file mode 100644 index 00000000..dcfbf487 --- /dev/null +++ b/docs/reference/graph_implementation,Conv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,CumSum-method.html b/docs/reference/graph_implementation,CumSum-method.html new file mode 100644 index 00000000..9d5b0806 --- /dev/null +++ b/docs/reference/graph_implementation,CumSum-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,DiagMat-method.html b/docs/reference/graph_implementation,DiagMat-method.html new file mode 100644 index 00000000..c7ee6a1c --- /dev/null +++ b/docs/reference/graph_implementation,DiagMat-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,DiagVec-method.html b/docs/reference/graph_implementation,DiagVec-method.html new file mode 100644 index 00000000..13c5eb42 --- /dev/null +++ b/docs/reference/graph_implementation,DiagVec-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,DivExpression-method.html b/docs/reference/graph_implementation,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/graph_implementation,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,HStack-method.html b/docs/reference/graph_implementation,HStack-method.html new file mode 100644 index 00000000..306a2fec --- /dev/null +++ b/docs/reference/graph_implementation,HStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,Index-method.html b/docs/reference/graph_implementation,Index-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/graph_implementation,Index-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,Kron-method.html b/docs/reference/graph_implementation,Kron-method.html new file mode 100644 index 00000000..1b6e7ff6 --- /dev/null +++ b/docs/reference/graph_implementation,Kron-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,MulExpression-method.html b/docs/reference/graph_implementation,MulExpression-method.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/graph_implementation,MulExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,Multiply-method.html b/docs/reference/graph_implementation,Multiply-method.html new file mode 100644 index 00000000..99f85b11 --- /dev/null +++ b/docs/reference/graph_implementation,Multiply-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,NegExpression-method.html b/docs/reference/graph_implementation,NegExpression-method.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/graph_implementation,NegExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,Promote-method.html b/docs/reference/graph_implementation,Promote-method.html new file mode 100644 index 00000000..3454ffa2 --- /dev/null +++ b/docs/reference/graph_implementation,Promote-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,Reshape-method.html b/docs/reference/graph_implementation,Reshape-method.html new file mode 100644 index 00000000..cbc7c98b --- /dev/null +++ b/docs/reference/graph_implementation,Reshape-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,SumEntries-method.html b/docs/reference/graph_implementation,SumEntries-method.html new file mode 100644 index 00000000..4b2e8863 --- /dev/null +++ b/docs/reference/graph_implementation,SumEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,Trace-method.html b/docs/reference/graph_implementation,Trace-method.html new file mode 100644 index 00000000..4a1e58a1 --- /dev/null +++ b/docs/reference/graph_implementation,Trace-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,Transpose-method.html b/docs/reference/graph_implementation,Transpose-method.html new file mode 100644 index 00000000..6d90f546 --- /dev/null +++ b/docs/reference/graph_implementation,Transpose-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,UpperTri-method.html b/docs/reference/graph_implementation,UpperTri-method.html new file mode 100644 index 00000000..0d5027f1 --- /dev/null +++ b/docs/reference/graph_implementation,UpperTri-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,VStack-method.html b/docs/reference/graph_implementation,VStack-method.html new file mode 100644 index 00000000..736da1a4 --- /dev/null +++ b/docs/reference/graph_implementation,VStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation,Wrap-method.html b/docs/reference/graph_implementation,Wrap-method.html new file mode 100644 index 00000000..e1ae511d --- /dev/null +++ b/docs/reference/graph_implementation,Wrap-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/graph_implementation.html b/docs/reference/graph_implementation.html index ff48fda4..480c9c4e 100644 --- a/docs/reference/graph_implementation.html +++ b/docs/reference/graph_implementation.html @@ -1,9 +1,9 @@ -Graph Implementation — graph_implementation • CVXRGraph Implementation — graph_implementation • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Graph Implementation

Arguments

-
object
+ + +
object

An Expression object.

-
arg_objs
+
arg_objs

A list of linear expressions for each argument.

-
dim
+
dim

A vector representing the dimensions of the resulting expression.

-
data
+
data

A list of additional data required by the atom.

Value

- - -

A list of list(LinOp for objective, list of constraints), where LinOp is a list representing the linear operator.

+

A list of list(LinOp for objective, list of constraints), where LinOp is a list representing the linear operator.

@@ -106,15 +106,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/group_coeff_offset,ConicSolver-method.html b/docs/reference/group_coeff_offset,ConicSolver-method.html new file mode 100644 index 00000000..0143e4e5 --- /dev/null +++ b/docs/reference/group_coeff_offset,ConicSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/group_constraints.html b/docs/reference/group_constraints.html index b3137398..658d1a51 100644 --- a/docs/reference/group_constraints.html +++ b/docs/reference/group_constraints.html @@ -1,9 +1,9 @@ -Organize the constraints into a dictionary keyed by constraint names. — group_constraints • CVXROrganize the constraints into a dictionary keyed by constraint names. — group_constraints • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Organize the constraints into a dictionary keyed by constraint names.

Arguments

-
constraints
+ + +
constraints

a list of constraints.

Value

- - -

A list of constraint types where constr_map[[cone_type]] maps to a list.

+

A list of constraint types where constr_map[[cone_type]] maps to a list.

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/harmonic_mean.html b/docs/reference/harmonic_mean.html index d251d009..2c446117 100644 --- a/docs/reference/harmonic_mean.html +++ b/docs/reference/harmonic_mean.html @@ -1,9 +1,9 @@ -Harmonic Mean — harmonic_mean • CVXRHarmonic Mean — harmonic_mean • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Harmonic Mean

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

Value

- - -

An Expression representing the harmonic mean of the input.

+

An Expression representing the harmonic mean of the input.

@@ -105,15 +105,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/hstack.html b/docs/reference/hstack.html index 1cb45e45..306a2fec 100644 --- a/docs/reference/hstack.html +++ b/docs/reference/hstack.html @@ -1,158 +1,8 @@ - -Horizontal Concatenation — hstack • CVXR - - -
-
- - - -
-
- - -
-

The horizontal concatenation of expressions. -This is equivalent to cbind when applied to objects with the same number of rows.

-
- -
-
hstack(...)
-
- -
-

Arguments

-
...
-

Expression objects, vectors, or matrices. All arguments must have the same number of rows.

- -
-
-

Value

- - -

An Expression representing the concatenated inputs.

-
- -
-

Examples

-
x <- Variable(2)
-y <- Variable(3)
-c <- matrix(1, nrow = 1, ncol = 5)
-prob <- Problem(Minimize(c %*% t(hstack(t(x), t(y)))), list(x == c(1,2), y == c(3,4,5)))
-result <- solve(prob)
-result$value
-#> [1] 15
-
-c <- matrix(1, nrow = 1, ncol = 4)
-prob <- Problem(Minimize(c %*% t(hstack(t(x), t(x)))), list(x == c(1,2)))
-result <- solve(prob)
-result$value
-#> [1] 6
-
-A <- Variable(2,2)
-C <- Variable(3,2)
-c <- matrix(1, nrow = 2, ncol = 2)
-prob <- Problem(Minimize(sum_entries(hstack(t(A), t(C)))), list(A >= 2*c, C == -2))
-result <- solve(prob)
-result$value
-#> [1] -4
-result$getValue(A)
-#>      [,1] [,2]
-#> [1,]    2    2
-#> [2,]    2    2
-
-D <- Variable(3,3)
-expr <- hstack(C, D)
-obj <- expr[1,2] + sum(hstack(expr, expr))
-constr <- list(C >= 0, D >= 0, D[1,1] == 2, C[1,2] == 3)
-prob <- Problem(Minimize(obj), constr)
-result <- solve(prob)
-result$value
-#> [1] 13
-result$getValue(C)
-#>              [,1]         [,2]
-#> [1,] 6.665644e-31 3.000000e+00
-#> [2,] 6.665644e-31 6.665644e-31
-#> [3,] 6.665644e-31 6.665644e-31
-result$getValue(D)
-#>              [,1]         [,2]         [,3]
-#> [1,] 2.000000e+00 6.665644e-31 6.665644e-31
-#> [2,] 6.665644e-31 6.665644e-31 6.665644e-31
-#> [3,] 6.665644e-31 6.665644e-31 6.665644e-31
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/huber.html b/docs/reference/huber.html index 54468f43..3797edb4 100644 --- a/docs/reference/huber.html +++ b/docs/reference/huber.html @@ -1,163 +1,8 @@ - -Huber Function — huber • CVXR - - -
-
- - - -
-
- - -
-

The elementwise Huber function, \(Huber(x, M) = 1\)

\(2M|x|-M^2\)
-

for \(|x| \geq |M|\)

- -
\(|x|^2\)
-

for \(|x| \leq |M|.\)

- - -
- -
-
huber(x, M = 1)
-
- -
-

Arguments

-
x
-

An Expression, vector, or matrix.

- - -
M
-

(Optional) A positive scalar value representing the threshold. Defaults to 1.

- -
-
-

Value

- - -

An Expression representing the Huber function evaluated at the input.

-
- -
-

Examples

-
set.seed(11)
-n <- 10
-m <- 450
-p <- 0.1    # Fraction of responses with sign flipped
-
-# Generate problem data
-beta_true <- 5*matrix(stats::rnorm(n), nrow = n)
-X <- matrix(stats::rnorm(m*n), nrow = m, ncol = n)
-y_true <- X %*% beta_true
-eps <- matrix(stats::rnorm(m), nrow = m)
-
-# Randomly flip sign of some responses
-factor <- 2*rbinom(m, size = 1, prob = 1-p) - 1
-y <- factor * y_true + eps
-
-# Huber regression
-beta <- Variable(n)
-obj <- sum(huber(y - X %*% beta, 1))
-prob <- Problem(Minimize(obj))
-result <- solve(prob)
-result$getValue(beta)
-#>             [,1]
-#>  [1,] -2.8809598
-#>  [2,]  0.1535914
-#>  [3,] -7.4980147
-#>  [4,] -6.8611676
-#>  [5,]  5.8162832
-#>  [6,] -4.6080355
-#>  [7,]  6.5681235
-#>  [8,]  3.1077124
-#>  [9,] -0.2235099
-#> [10,] -4.8797994
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/id,Canonical-method.html b/docs/reference/id,Canonical-method.html new file mode 100644 index 00000000..92de4b10 --- /dev/null +++ b/docs/reference/id,Canonical-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/id,ListORConstr-method.html b/docs/reference/id,ListORConstr-method.html new file mode 100644 index 00000000..697fafe9 --- /dev/null +++ b/docs/reference/id,ListORConstr-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/id.html b/docs/reference/id.html index 280a7250..2e58e954 100644 --- a/docs/reference/id.html +++ b/docs/reference/id.html @@ -1,9 +1,9 @@ -Identification Number — id • CVXRIdentification Number — id • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Identification Number

Arguments

-
object
+ + +
object

A Variable or Constraint object.

Value

- - -

A non-negative integer identifier.

+

A non-negative integer identifier.

See also

@@ -108,15 +108,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/import_solver,CBC_CONIC-method.html b/docs/reference/import_solver,CBC_CONIC-method.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/import_solver,CBC_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,CLARABEL-method.html b/docs/reference/import_solver,CLARABEL-method.html new file mode 100644 index 00000000..7b9f7df2 --- /dev/null +++ b/docs/reference/import_solver,CLARABEL-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,CPLEX_CONIC-method.html b/docs/reference/import_solver,CPLEX_CONIC-method.html new file mode 100644 index 00000000..4665af60 --- /dev/null +++ b/docs/reference/import_solver,CPLEX_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,CPLEX_QP-method.html b/docs/reference/import_solver,CPLEX_QP-method.html new file mode 100644 index 00000000..a63ea235 --- /dev/null +++ b/docs/reference/import_solver,CPLEX_QP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,CVXOPT-method.html b/docs/reference/import_solver,CVXOPT-method.html new file mode 100644 index 00000000..8a01311e --- /dev/null +++ b/docs/reference/import_solver,CVXOPT-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,ConstantSolver-method.html b/docs/reference/import_solver,ConstantSolver-method.html new file mode 100644 index 00000000..563daa80 --- /dev/null +++ b/docs/reference/import_solver,ConstantSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,ECOS-method.html b/docs/reference/import_solver,ECOS-method.html new file mode 100644 index 00000000..35ec5a21 --- /dev/null +++ b/docs/reference/import_solver,ECOS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,GLPK-method.html b/docs/reference/import_solver,GLPK-method.html new file mode 100644 index 00000000..b74a96a9 --- /dev/null +++ b/docs/reference/import_solver,GLPK-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,GUROBI_CONIC-method.html b/docs/reference/import_solver,GUROBI_CONIC-method.html new file mode 100644 index 00000000..f4a1f642 --- /dev/null +++ b/docs/reference/import_solver,GUROBI_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,GUROBI_QP-method.html b/docs/reference/import_solver,GUROBI_QP-method.html new file mode 100644 index 00000000..de519b9c --- /dev/null +++ b/docs/reference/import_solver,GUROBI_QP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,MOSEK-method.html b/docs/reference/import_solver,MOSEK-method.html new file mode 100644 index 00000000..4b67fe4e --- /dev/null +++ b/docs/reference/import_solver,MOSEK-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,OSQP-method.html b/docs/reference/import_solver,OSQP-method.html new file mode 100644 index 00000000..898d17aa --- /dev/null +++ b/docs/reference/import_solver,OSQP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,ReductionSolver-method.html b/docs/reference/import_solver,ReductionSolver-method.html new file mode 100644 index 00000000..11a3d8b1 --- /dev/null +++ b/docs/reference/import_solver,ReductionSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver,SCS-method.html b/docs/reference/import_solver,SCS-method.html new file mode 100644 index 00000000..5e0523ec --- /dev/null +++ b/docs/reference/import_solver,SCS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/import_solver.html b/docs/reference/import_solver.html index 7f1d395b..8a636457 100644 --- a/docs/reference/import_solver.html +++ b/docs/reference/import_solver.html @@ -1,9 +1,9 @@ -Import Solver — import_solver • CVXRImport Solver — import_solver • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,7 +71,9 @@

Import Solver

Arguments

-
solver
+ + +
solver

A ReductionSolver object.

@@ -96,15 +98,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/index.html b/docs/reference/index.html index 35f308df..c221c405 100644 --- a/docs/reference/index.html +++ b/docs/reference/index.html @@ -1,1726 +1,8 @@ - -Function reference • CVXR - - -
-
- - - -
-
- - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - - -
-

All functions

-

-
-

Abs() to_numeric(<Abs>) allow_complex(<Abs>) sign_from_args(<Abs>) is_atom_convex(<Abs>) is_atom_concave(<Abs>) is_incr(<Abs>) is_decr(<Abs>) is_pwl(<Abs>)

-

The Abs class.

-

`+`(<Expression>,<missing>) `+`(<Expression>,<Expression>) `+`(<Expression>,<ConstVal>) `+`(<ConstVal>,<Expression>) dim_from_args(<AddExpression>) name(<AddExpression>) to_numeric(<AddExpression>) is_atom_log_log_convex(<AddExpression>) is_atom_log_log_concave(<AddExpression>) is_symmetric(<AddExpression>) is_hermitian(<AddExpression>) copy(<AddExpression>) graph_implementation(<AddExpression>)

-

The AddExpression class.

-

allow_complex(<AffAtom>) sign_from_args(<AffAtom>) is_imag(<AffAtom>) is_complex(<AffAtom>) is_atom_convex(<AffAtom>) is_atom_concave(<AffAtom>) is_incr(<AffAtom>) is_decr(<AffAtom>) is_quadratic(<AffAtom>) is_qpwa(<AffAtom>) is_pwl(<AffAtom>) is_psd(<AffAtom>) is_nsd(<AffAtom>) .grad(<AffAtom>)

-

The AffAtom class.

-

name(<Atom>) validate_args(<Atom>) dim(<Atom>) nrow(<Atom>) ncol(<Atom>) allow_complex(<Atom>) is_nonneg(<Atom>) is_nonpos(<Atom>) is_imag(<Atom>) is_complex(<Atom>) is_convex(<Atom>) is_concave(<Atom>) is_log_log_convex(<Atom>) is_log_log_concave(<Atom>) canonicalize(<Atom>) graph_implementation(<Atom>) value_impl(<Atom>) value(<Atom>) grad(<Atom>) domain(<Atom>) atoms(<Atom>)

-

The Atom class.

-

dim_from_args(<AxisAtom>) get_data(<AxisAtom>) validate_args(<AxisAtom>) .axis_grad(<AxisAtom>) .column_grad(<AxisAtom>)

-

The AxisAtom class.

-

name(<BinaryOperator>) to_numeric(<BinaryOperator>) sign_from_args(<BinaryOperator>) is_imag(<BinaryOperator>) is_complex(<BinaryOperator>)

-

The BinaryOperator class.

-

CBC_CONIC() mip_capable(<CBC_CONIC>) status_map(<CBC_CONIC>) status_map_mip(<CBC_CONIC>) status_map_lp(<CBC_CONIC>) name(<CBC_CONIC>) import_solver(<CBC_CONIC>) accepts(<CBC_CONIC>,<Problem>) perform(<CBC_CONIC>,<Problem>) invert(<CBC_CONIC>,<list>,<list>) solve_via_data(<CBC_CONIC>)

-

An interface to the CBC solver

-

CLARABEL() mip_capable(<CLARABEL>) status_map(<CLARABEL>) name(<CLARABEL>) import_solver(<CLARABEL>) reduction_format_constr(<CLARABEL>) perform(<CLARABEL>,<Problem>) invert(<CLARABEL>,<list>,<list>) solve_via_data(<CLARABEL>)

-

An interface for the CLARABEL solver

-

CLARABEL.dims_to_solver_dict()

-

Utility method for formatting a ConeDims instance into a dictionary that can be supplied to Clarabel

-

CLARABEL.extract_dual_value()

-

Extracts the dual value for constraint starting at offset.

-

CPLEX_CONIC() mip_capable(<CPLEX_CONIC>) name(<CPLEX_CONIC>) import_solver(<CPLEX_CONIC>) accepts(<CPLEX_CONIC>,<Problem>) status_map(<CPLEX_CONIC>) perform(<CPLEX_CONIC>,<Problem>) invert(<CPLEX_CONIC>,<list>,<list>) solve_via_data(<CPLEX_CONIC>)

-

An interface for the CPLEX solver

-

CPLEX_QP() mip_capable(<CPLEX_QP>) status_map(<CPLEX_QP>) name(<CPLEX_QP>) import_solver(<CPLEX_QP>) invert(<CPLEX_QP>,<list>,<InverseData>) solve_via_data(<CPLEX_QP>)

-

An interface for the CPLEX solver.

-

mip_capable(<CVXOPT>) status_map(<CVXOPT>) name(<CVXOPT>) import_solver(<CVXOPT>) accepts(<CVXOPT>,<Problem>) perform(<CVXOPT>,<Problem>) invert(<CVXOPT>,<list>,<list>) solve_via_data(<CVXOPT>)

-

An interface for the CVXOPT solver.

-

CallbackParam() value(<CallbackParam>)

-

The CallbackParam class.

-

expr(<Canonical>) id(<Canonical>) canonical_form(<Canonical>) variables(<Canonical>) parameters(<Canonical>) constants(<Canonical>) atoms(<Canonical>) get_data(<Canonical>)

-

The Canonical class.

-

perform(<Canonicalization>,<Problem>) invert(<Canonicalization>,<Solution>,<InverseData>) canonicalize_tree(<Canonicalization>) canonicalize_expr(<Canonicalization>)

-

The Canonicalization class.

-

as.character(<Chain>) accepts(<Chain>,<Problem>) perform(<Chain>,<Problem>) invert(<Chain>,<SolutionORList>,<list>)

-

The Chain class.

-

accepts(<Complex2Real>,<Problem>) perform(<Complex2Real>,<Problem>) invert(<Complex2Real>,<Solution>,<InverseData>)

-

Lifts complex numbers to a real representation.

-

Complex2Real.abs_canon()

-

Complex canonicalizer for the absolute value atom

-

Complex2Real.add()

-

Helper function to sum arguments.

-

Complex2Real.at_least_2D()

-

Upcast 0D and 1D to 2D.

-

Complex2Real.binary_canon()

-

Complex canonicalizer for the binary atom

-

Complex2Real.canonicalize_expr()

-

Canonicalizes a Complex Expression

-

Complex2Real.canonicalize_tree()

-

Recursively Canonicalizes a Complex Expression.

-

Complex2Real.conj_canon()

-

Complex canonicalizer for the conjugate atom

-

Complex2Real.constant_canon()

-

Complex canonicalizer for the constant atom

-

Complex2Real.hermitian_canon()

-

Complex canonicalizer for the hermitian atom

-

Complex2Real.imag_canon()

-

Complex canonicalizer for the imaginary atom

-

Complex2Real.join()

-

Helper function to combine arguments.

-

Complex2Real.lambda_sum_largest_canon()

-

Complex canonicalizer for the largest sum atom

-

Complex2Real.matrix_frac_canon()

-

Complex canonicalizer for the matrix fraction atom

-

Complex2Real.nonpos_canon()

-

Complex canonicalizer for the non-positive atom

-

Complex2Real.norm_nuc_canon()

-

Complex canonicalizer for the nuclear norm atom

-

Complex2Real.param_canon()

-

Complex canonicalizer for the parameter matrix atom

-

Complex2Real.pnorm_canon()

-

Complex canonicalizer for the p norm atom

-

Complex2Real.psd_canon()

-

Complex canonicalizer for the positive semidefinite atom

-

Complex2Real.quad_canon()

-

Complex canonicalizer for the quadratic atom

-

Complex2Real.quad_over_lin_canon()

-

Complex canonicalizer for the quadratic over linear term atom

-

Complex2Real.real_canon()

-

Complex canonicalizer for the real atom

-

Complex2Real.separable_canon()

-

Complex canonicalizer for the separable atom

-

Complex2Real.soc_canon()

-

Complex canonicalizer for the SOC atom

-

Complex2Real.variable_canon()

-

Complex canonicalizer for the variable atom

-

Complex2Real.zero_canon()

-

Complex canonicalizer for the zero atom

-

ConeDims-class .ConeDims

-

Summary of cone dimensions present in constraints.

-

accepts(<ConeMatrixStuffing>,<Problem>) stuffed_objective(<ConeMatrixStuffing>,<Problem>,<CoeffExtractor>)

-

Construct Matrices for Linear Cone Problems

-

accepts(<ConicSolver>,<Problem>) reduction_format_constr(<ConicSolver>) group_coeff_offset(<ConicSolver>) invert(<ConicSolver>,<Solution>,<InverseData>)

-

The ConicSolver class.

-

ConicSolver.get_coeff_offset()

-

Return the coefficient and offset in \(Ax + b\).

-

ConicSolver.get_spacing_matrix()

-

Returns a sparse matrix that spaces out an expression.

-

Conjugate() to_numeric(<Conjugate>) dim_from_args(<Conjugate>) is_incr(<Conjugate>) is_decr(<Conjugate>) is_symmetric(<Conjugate>) is_hermitian(<Conjugate>)

-

The Conjugate class.

-

Constant() show(<Constant>) name(<Constant>) constants(<Constant>) value(<Constant>) is_pos(<Constant>) grad(<Constant>) dim(<Constant>) canonicalize(<Constant>) is_nonneg(<Constant>) is_nonpos(<Constant>) is_imag(<Constant>) is_complex(<Constant>) is_symmetric(<Constant>) is_hermitian(<Constant>) is_psd(<Constant>) is_nsd(<Constant>) as.Constant()

-

The Constant class.

-

mip_capable(<ConstantSolver>) accepts(<ConstantSolver>,<Problem>) perform(<ConstantSolver>,<Problem>) invert(<ConstantSolver>,<Solution>,<list>) name(<ConstantSolver>) import_solver(<ConstantSolver>) is_installed(<ConstantSolver>) solve_via_data(<ConstantSolver>) reduction_solve(<ConstantSolver>,<ANY>)

-

The ConstantSolver class.

-

as.character(<Constraint>) dim(<Constraint>) size(<Constraint>) is_real(<Constraint>) is_imag(<Constraint>) is_complex(<Constraint>) is_dcp(<Constraint>) is_dgp(<Constraint>) residual(<Constraint>) violation(<Constraint>) constr_value(<Constraint>) get_data(<Constraint>) dual_value(<Constraint>) `dual_value<-`(<Constraint>) size(<ZeroConstraint>)

-

The Constraint class.

-

Conv() to_numeric(<Conv>) validate_args(<Conv>) dim_from_args(<Conv>) sign_from_args(<Conv>) is_incr(<Conv>) is_decr(<Conv>) graph_implementation(<Conv>)

-

The Conv class.

-

CumMax() to_numeric(<CumMax>) .grad(<CumMax>) .column_grad(<CumMax>) dim_from_args(<CumMax>) sign_from_args(<CumMax>) get_data(<CumMax>) is_atom_convex(<CumMax>) is_atom_concave(<CumMax>) is_incr(<CumMax>) is_decr(<CumMax>)

-

The CumMax class.

-

CumSum() to_numeric(<CumSum>) dim_from_args(<CumSum>) get_data(<CumSum>) .grad(<CumSum>) graph_implementation(<CumSum>)

-

The CumSum class.

-

perform(<CvxAttr2Constr>,<Problem>) invert(<CvxAttr2Constr>,<Solution>,<list>)

-

The CvxAttr2Constr class.

-

accepts(<Dcp2Cone>,<Problem>) perform(<Dcp2Cone>,<Problem>)

-

Reduce DCP Problem to Conic Form

-

Dcp2Cone.entr_canon()

-

Dcp2Cone canonicalizer for the entropy atom

-

Dcp2Cone.exp_canon()

-

Dcp2Cone canonicalizer for the exponential atom

-

Dcp2Cone.geo_mean_canon()

-

Dcp2Cone canonicalizer for the geometric mean atom

-

Dcp2Cone.huber_canon()

-

Dcp2Cone canonicalizer for the huber atom

-

Dcp2Cone.indicator_canon()

-

Dcp2Cone canonicalizer for the indicator atom

-

Dcp2Cone.kl_div_canon()

-

Dcp2Cone canonicalizer for the KL Divergence atom

-

Dcp2Cone.lambda_max_canon()

-

Dcp2Cone canonicalizer for the lambda maximization atom

-

Dcp2Cone.lambda_sum_largest_canon()

-

Dcp2Cone canonicalizer for the largest lambda sum atom

-

Dcp2Cone.log1p_canon()

-

Dcp2Cone canonicalizer for the log 1p atom

-

Dcp2Cone.log_canon()

-

Dcp2Cone canonicalizer for the log atom

-

Dcp2Cone.log_det_canon()

-

Dcp2Cone canonicalizer for the log determinant atom

-

Dcp2Cone.log_sum_exp_canon()

-

Dcp2Cone canonicalizer for the log sum of the exp atom

-

Dcp2Cone.logistic_canon()

-

Dcp2Cone canonicalizer for the logistic function atom

-

Dcp2Cone.matrix_frac_canon()

-

Dcp2Cone canonicalizer for the matrix fraction atom

-

Dcp2Cone.normNuc_canon()

-

Dcp2Cone canonicalizer for the nuclear norm atom

-

Dcp2Cone.pnorm_canon()

-

Dcp2Cone canonicalizer for the p norm atom

-

Dcp2Cone.power_canon()

-

Dcp2Cone canonicalizer for the power atom

-

Dcp2Cone.quad_form_canon()

-

Dcp2Cone canonicalizer for the quadratic form atom

-

Dcp2Cone.quad_over_lin_canon()

-

Dcp2Cone canonicalizer for the quadratic over linear term atom

-

Dcp2Cone.sigma_max_canon()

-

Dcp2Cone canonicalizer for the sigma max atom

-

accepts(<Dgp2Dcp>,<Problem>) perform(<Dgp2Dcp>,<Problem>) canonicalize_expr(<Dgp2Dcp>) invert(<Dgp2Dcp>,<Solution>,<InverseData>)

-

Reduce DGP problems to DCP problems.

-

Dgp2Dcp.add_canon()

-

Dgp2Dcp canonicalizer for the addition atom

-

Dgp2Dcp.constant_canon()

-

Dgp2Dcp canonicalizer for the constant atom

-

Dgp2Dcp.div_canon()

-

Dgp2Dcp canonicalizer for the division atom

-

Dgp2Dcp.exp_canon()

-

Dgp2Dcp canonicalizer for the exp atom

-

Dgp2Dcp.eye_minus_inv_canon()

-

Dgp2Dcp canonicalizer for the \((I - X)^{-1}\) atom

-

Dgp2Dcp.geo_mean_canon()

-

Dgp2Dcp canonicalizer for the geometric mean atom

-

Dgp2Dcp.log_canon()

-

Dgp2Dcp canonicalizer for the log atom

-

Dgp2Dcp.mul_canon()

-

Dgp2Dcp canonicalizer for the multiplication atom

-

Dgp2Dcp.mulexpression_canon()

-

Dgp2Dcp canonicalizer for the multiplication expression atom

-

Dgp2Dcp.nonpos_constr_canon()

-

Dgp2Dcp canonicalizer for the non-positive constraint atom

-

Dgp2Dcp.norm1_canon()

-

Dgp2Dcp canonicalizer for the 1 norm atom

-

Dgp2Dcp.norm_inf_canon()

-

Dgp2Dcp canonicalizer for the infinite norm atom

-

Dgp2Dcp.one_minus_pos_canon()

-

Dgp2Dcp canonicalizer for the 1-x atom

-

Dgp2Dcp.parameter_canon()

-

Dgp2Dcp canonicalizer for the parameter atom

-

Dgp2Dcp.pf_eigenvalue_canon()

-

Dgp2Dcp canonicalizer for the spectral radius atom

-

Dgp2Dcp.pnorm_canon()

-

Dgp2Dcp canonicalizer for the p norm atom

-

Dgp2Dcp.power_canon()

-

Dgp2Dcp canonicalizer for the power atom

-

Dgp2Dcp.prod_canon()

-

Dgp2Dcp canonicalizer for the product atom

-

Dgp2Dcp.quad_form_canon()

-

Dgp2Dcp canonicalizer for the quadratic form atom

-

Dgp2Dcp.quad_over_lin_canon()

-

Dgp2Dcp canonicalizer for the quadratic over linear term atom

-

Dgp2Dcp.sum_canon()

-

Dgp2Dcp canonicalizer for the sum atom

-

Dgp2Dcp.trace_canon()

-

Dgp2Dcp canonicalizer for the trace atom

-

Dgp2Dcp.zero_constr_canon()

-

Dgp2Dcp canonicalizer for the zero constraint atom

-

names(<DgpCanonMethods>) `$`(<DgpCanonMethods>)

-

DGP canonical methods class.

-

Diag()

-

Turns an expression into a DiagVec object

-

DiagMat() to_numeric(<DiagMat>) dim_from_args(<DiagMat>) is_atom_log_log_convex(<DiagMat>) is_atom_log_log_concave(<DiagMat>) graph_implementation(<DiagMat>)

-

The DiagMat class.

-

DiagVec() to_numeric(<DiagVec>) dim_from_args(<DiagVec>) is_atom_log_log_convex(<DiagVec>) is_atom_log_log_concave(<DiagVec>) is_symmetric(<DiagVec>) is_hermitian(<DiagVec>) graph_implementation(<DiagVec>)

-

The DiagVec class.

-

Diff()

-

Takes the k-th order differences

-

DiffPos()

-

The DiffPos atom.

-

`/`(<Expression>,<Expression>) `/`(<Expression>,<ConstVal>) `/`(<ConstVal>,<Expression>) to_numeric(<DivExpression>) is_quadratic(<DivExpression>) is_qpwa(<DivExpression>) dim_from_args(<DivExpression>) is_atom_convex(<DivExpression>) is_atom_concave(<DivExpression>) is_atom_log_log_convex(<DivExpression>) is_atom_log_log_concave(<DivExpression>) is_incr(<DivExpression>) is_decr(<DivExpression>) graph_implementation(<DivExpression>)

-

The DivExpression class.

-

ECOS() mip_capable(<ECOS>) status_map(<ECOS>) import_solver(<ECOS>) name(<ECOS>) perform(<ECOS>,<Problem>) invert(<ECOS>,<list>,<list>)

-

An interface for the ECOS solver

-

ECOS.dims_to_solver_dict()

-

Utility method for formatting a ConeDims instance into a dictionary that can be supplied to ECOS.

-

ECOS_BB() mip_capable(<ECOS_BB>) name(<ECOS_BB>) perform(<ECOS_BB>,<Problem>) solve_via_data(<ECOS_BB>)

-

An interface for the ECOS BB solver.

-

dim_from_args(<Elementwise>) validate_args(<Elementwise>) is_symmetric(<Elementwise>)

-

The Elementwise class.

-

accepts(<EliminatePwl>,<Problem>)

-

The EliminatePwl class.

-

EliminatePwl.abs_canon()

-

EliminatePwl canonicalizer for the absolute atom

-

EliminatePwl.cummax_canon()

-

EliminatePwl canonicalizer for the cumulative max atom

-

EliminatePwl.cumsum_canon()

-

EliminatePwl canonicalizer for the cumulative sum atom

-

EliminatePwl.max_elemwise_canon()

-

EliminatePwl canonicalizer for the elementwise maximum atom

-

EliminatePwl.max_entries_canon()

-

EliminatePwl canonicalizer for the max entries atom

-

EliminatePwl.min_elemwise_canon()

-

EliminatePwl canonicalizer for the elementwise minimum atom

-

EliminatePwl.min_entries_canon()

-

EliminatePwl canonicalizer for the minimum entries atom

-

EliminatePwl.norm1_canon()

-

EliminatePwl canonicalizer for the 1 norm atom

-

EliminatePwl.norm_inf_canon()

-

EliminatePwl canonicalizer for the infinite norm atom

-

EliminatePwl.sum_largest_canon()

-

EliminatePwl canonicalizer for the largest sum atom

-

Entr() to_numeric(<Entr>) sign_from_args(<Entr>) is_atom_convex(<Entr>) is_atom_concave(<Entr>) is_incr(<Entr>) is_decr(<Entr>) .grad(<Entr>) .domain(<Entr>)

-

The Entr class.

-

`==`(<Expression>,<Expression>) `==`(<Expression>,<ConstVal>) `==`(<ConstVal>,<Expression>) name(<EqConstraint>) dim(<EqConstraint>) size(<EqConstraint>) expr(<EqConstraint>) is_dcp(<EqConstraint>) is_dgp(<EqConstraint>) residual(<EqConstraint>)

-

The EqConstraint class

-

perform(<EvalParams>,<Problem>) invert(<EvalParams>,<Solution>,<list>)

-

The EvalParams class.

-

Exp() to_numeric(<Exp>) sign_from_args(<Exp>) is_atom_convex(<Exp>) is_atom_concave(<Exp>) is_atom_log_log_convex(<Exp>) is_atom_log_log_concave(<Exp>) is_incr(<Exp>) is_decr(<Exp>) .grad(<Exp>)

-

The Exp class.

-

ExpCone() as.character(<ExpCone>) residual(<ExpCone>) size(<ExpCone>) num_cones(<ExpCone>) cone_sizes(<ExpCone>) is_dcp(<ExpCone>) is_dgp(<ExpCone>) canonicalize(<ExpCone>)

-

The ExpCone class.

-

value(<Expression>) grad(<Expression>) domain(<Expression>) as.character(<Expression>) name(<Expression>) expr(<Expression>) is_constant(<Expression>) is_affine(<Expression>) is_convex(<Expression>) is_concave(<Expression>) is_dcp(<Expression>) is_log_log_constant(<Expression>) is_log_log_affine(<Expression>) is_log_log_convex(<Expression>) is_log_log_concave(<Expression>) is_dgp(<Expression>) is_hermitian(<Expression>) is_psd(<Expression>) is_nsd(<Expression>) is_quadratic(<Expression>) is_symmetric(<Expression>) is_pwl(<Expression>) is_qpwa(<Expression>) is_zero(<Expression>) is_nonneg(<Expression>) is_nonpos(<Expression>) dim(<Expression>) is_real(<Expression>) is_imag(<Expression>) is_complex(<Expression>) size(<Expression>) ndim(<Expression>) flatten(<Expression>) is_scalar(<Expression>) is_vector(<Expression>) is_matrix(<Expression>) nrow(<Expression>) ncol(<Expression>)

-

The Expression class.

-

EyeMinusInv() to_numeric(<EyeMinusInv>) name(<EyeMinusInv>) dim_from_args(<EyeMinusInv>) sign_from_args(<EyeMinusInv>) is_atom_convex(<EyeMinusInv>) is_atom_concave(<EyeMinusInv>) is_atom_log_log_convex(<EyeMinusInv>) is_atom_log_log_concave(<EyeMinusInv>) is_incr(<EyeMinusInv>) is_decr(<EyeMinusInv>) .grad(<EyeMinusInv>)

-

The EyeMinusInv class.

-

perform(<FlipObjective>,<Problem>) invert(<FlipObjective>,<Solution>,<list>)

-

The FlipObjective class.

-

GLPK() mip_capable(<GLPK>) status_map(<GLPK>) name(<GLPK>) import_solver(<GLPK>) invert(<GLPK>,<list>,<list>) solve_via_data(<GLPK>)

-

An interface for the GLPK solver.

-

GLPK_MI() mip_capable(<GLPK_MI>) status_map(<GLPK_MI>) name(<GLPK_MI>) solve_via_data(<GLPK_MI>)

-

An interface for the GLPK MI solver.

-

GUROBI_CONIC() mip_capable(<GUROBI_CONIC>) name(<GUROBI_CONIC>) import_solver(<GUROBI_CONIC>) status_map(<GUROBI_CONIC>) accepts(<GUROBI_CONIC>,<Problem>) perform(<GUROBI_CONIC>,<Problem>) invert(<GUROBI_CONIC>,<list>,<list>) solve_via_data(<GUROBI_CONIC>)

-

An interface for the GUROBI conic solver.

-

GUROBI_QP() mip_capable(<GUROBI_QP>) status_map(<GUROBI_QP>) name(<GUROBI_QP>) import_solver(<GUROBI_QP>) solve_via_data(<GUROBI_QP>) invert(<GUROBI_QP>,<list>,<InverseData>)

-

An interface for the GUROBI_QP solver.

-

GeoMean() to_numeric(<GeoMean>) .domain(<GeoMean>) .grad(<GeoMean>) name(<GeoMean>) dim_from_args(<GeoMean>) sign_from_args(<GeoMean>) is_atom_convex(<GeoMean>) is_atom_concave(<GeoMean>) is_atom_log_log_convex(<GeoMean>) is_atom_log_log_concave(<GeoMean>) is_incr(<GeoMean>) is_decr(<GeoMean>) get_data(<GeoMean>) copy(<GeoMean>)

-

The GeoMean class.

-

HStack() to_numeric(<HStack>) dim_from_args(<HStack>) is_atom_log_log_convex(<HStack>) is_atom_log_log_concave(<HStack>) validate_args(<HStack>) graph_implementation(<HStack>)

-

The HStack class.

-

HarmonicMean()

-

The HarmonicMean atom.

-

Huber() to_numeric(<Huber>) sign_from_args(<Huber>) is_atom_convex(<Huber>) is_atom_concave(<Huber>) is_incr(<Huber>) is_decr(<Huber>) is_quadratic(<Huber>) get_data(<Huber>) validate_args(<Huber>) .grad(<Huber>)

-

The Huber class.

-

Imag() to_numeric(<Imag>) dim_from_args(<Imag>) is_imag(<Imag>) is_complex(<Imag>) is_symmetric(<Imag>)

-

The Imag class.

-

`[`(<Expression>,<missing>,<missing>,<ANY>) `[`(<Expression>,<numeric>,<missing>,<ANY>) `[`(<Expression>,<missing>,<numeric>,<ANY>) `[`(<Expression>,<numeric>,<numeric>,<ANY>) Index() to_numeric(<Index>) dim_from_args(<Index>) is_atom_log_log_convex(<Index>) is_atom_log_log_concave(<Index>) get_data(<Index>) graph_implementation(<Index>) to_numeric(<SpecialIndex>) dim_from_args(<SpecialIndex>)

-

The Index class.

-

`<=`(<Expression>,<Expression>) `<=`(<Expression>,<ConstVal>) `<=`(<ConstVal>,<Expression>) `<`(<Expression>,<Expression>) `<`(<Expression>,<ConstVal>) `<`(<ConstVal>,<Expression>) `>=`(<Expression>,<Expression>) `>=`(<Expression>,<ConstVal>) `>=`(<ConstVal>,<Expression>) `>`(<Expression>,<Expression>) `>`(<Expression>,<ConstVal>) `>`(<ConstVal>,<Expression>) name(<IneqConstraint>) dim(<IneqConstraint>) size(<IneqConstraint>) expr(<IneqConstraint>) is_dcp(<IneqConstraint>) is_dgp(<IneqConstraint>) residual(<IneqConstraint>)

-

The IneqConstraint class

-

InverseData-class .InverseData

-

The InverseData class.

-

KLDiv() to_numeric(<KLDiv>) sign_from_args(<KLDiv>) is_atom_convex(<KLDiv>) is_atom_concave(<KLDiv>) is_incr(<KLDiv>) is_decr(<KLDiv>) .grad(<KLDiv>) .domain(<KLDiv>)

-

The KLDiv class.

-

Kron() to_numeric(<Kron>) validate_args(<Kron>) dim_from_args(<Kron>) sign_from_args(<Kron>) is_incr(<Kron>) is_decr(<Kron>) graph_implementation(<Kron>)

-

The Kron class.

-

LambdaMax() to_numeric(<LambdaMax>) .domain(<LambdaMax>) .grad(<LambdaMax>) validate_args(<LambdaMax>) dim_from_args(<LambdaMax>) sign_from_args(<LambdaMax>) is_atom_convex(<LambdaMax>) is_atom_concave(<LambdaMax>) is_incr(<LambdaMax>) is_decr(<LambdaMax>)

-

The LambdaMax class.

-

LambdaMin()

-

The LambdaMin atom.

-

LambdaSumLargest() allow_complex(<LambdaSumLargest>) to_numeric(<LambdaSumLargest>) validate_args(<LambdaSumLargest>) get_data(<LambdaSumLargest>) .grad(<LambdaSumLargest>)

-

The LambdaSumLargest class.

-

LambdaSumSmallest()

-

The LambdaSumSmallest atom.

-

get_data(<Leaf>) dim(<Leaf>) variables(<Leaf>) parameters(<Leaf>) constants(<Leaf>) atoms(<Leaf>) is_convex(<Leaf>) is_concave(<Leaf>) is_log_log_convex(<Leaf>) is_log_log_concave(<Leaf>) is_nonneg(<Leaf>) is_nonpos(<Leaf>) is_pos(<Leaf>) is_neg(<Leaf>) is_hermitian(<Leaf>) is_symmetric(<Leaf>) is_imag(<Leaf>) is_complex(<Leaf>) domain(<Leaf>) project(<Leaf>) project_and_assign(<Leaf>) value(<Leaf>) `value<-`(<Leaf>) validate_val(<Leaf>) is_psd(<Leaf>) is_nsd(<Leaf>) is_quadratic(<Leaf>) is_pwl(<Leaf>)

-

The Leaf class.

-

id(<ListORConstr>)

-

A Class Union of List and Constraint

-

Log() to_numeric(<Log>) sign_from_args(<Log>) is_atom_convex(<Log>) is_atom_concave(<Log>) is_atom_log_log_convex(<Log>) is_atom_log_log_concave(<Log>) is_incr(<Log>) is_decr(<Log>) .grad(<Log>) .domain(<Log>)

-

The Log class.

-

Log1p() to_numeric(<Log1p>) sign_from_args(<Log1p>) .grad(<Log1p>) .domain(<Log1p>)

-

The Log1p class.

-

LogDet() to_numeric(<LogDet>) validate_args(<LogDet>) dim_from_args(<LogDet>) sign_from_args(<LogDet>) is_atom_convex(<LogDet>) is_atom_concave(<LogDet>) is_incr(<LogDet>) is_decr(<LogDet>) .grad(<LogDet>) .domain(<LogDet>)

-

The LogDet class.

-

LogSumExp() to_numeric(<LogSumExp>) .grad(<LogSumExp>) .column_grad(<LogSumExp>) sign_from_args(<LogSumExp>) is_atom_convex(<LogSumExp>) is_atom_concave(<LogSumExp>) is_incr(<LogSumExp>) is_decr(<LogSumExp>)

-

The LogSumExp class.

-

Logistic() to_numeric(<Logistic>) sign_from_args(<Logistic>) is_atom_convex(<Logistic>) is_atom_concave(<Logistic>) is_incr(<Logistic>) is_decr(<Logistic>) .grad(<Logistic>)

-

The Logistic class.

-

MOSEK() mip_capable(<MOSEK>) import_solver(<MOSEK>) name(<MOSEK>) accepts(<MOSEK>,<Problem>) block_format(<MOSEK>) perform(<MOSEK>,<Problem>) solve_via_data(<MOSEK>) invert(<MOSEK>,<ANY>,<ANY>)

-

An interface for the MOSEK solver.

-

MOSEK.parse_dual_vars()

-

Parses MOSEK dual variables into corresponding CVXR constraints and dual values

-

MOSEK.recover_dual_variables()

-

Recovers MOSEK solutions dual variables

-

MatrixFrac() allow_complex(<MatrixFrac>) to_numeric(<MatrixFrac>) validate_args(<MatrixFrac>) dim_from_args(<MatrixFrac>) sign_from_args(<MatrixFrac>) is_atom_convex(<MatrixFrac>) is_atom_concave(<MatrixFrac>) is_incr(<MatrixFrac>) is_decr(<MatrixFrac>) is_quadratic(<MatrixFrac>) is_qpwa(<MatrixFrac>) .domain(<MatrixFrac>) .grad(<MatrixFrac>)

-

The MatrixFrac class.

-

perform(<MatrixStuffing>,<Problem>) invert(<MatrixStuffing>,<Solution>,<InverseData>)

-

The MatrixStuffing class.

-

MaxElemwise() to_numeric(<MaxElemwise>) sign_from_args(<MaxElemwise>) is_atom_convex(<MaxElemwise>) is_atom_concave(<MaxElemwise>) is_atom_log_log_convex(<MaxElemwise>) is_atom_log_log_concave(<MaxElemwise>) is_incr(<MaxElemwise>) is_decr(<MaxElemwise>) is_pwl(<MaxElemwise>) .grad(<MaxElemwise>)

-

The MaxElemwise class.

-

MaxEntries() to_numeric(<MaxEntries>) sign_from_args(<MaxEntries>) is_atom_convex(<MaxEntries>) is_atom_concave(<MaxEntries>) is_atom_log_log_convex(<MaxEntries>) is_atom_log_log_concave(<MaxEntries>) is_incr(<MaxEntries>) is_decr(<MaxEntries>) is_pwl(<MaxEntries>) .grad(<MaxEntries>) .column_grad(<MaxEntries>)

-

The MaxEntries class.

-

Maximize() canonicalize(<Maximize>) is_dcp(<Maximize>) is_dgp(<Maximize>)

-

The Maximize class.

-

MinElemwise() to_numeric(<MinElemwise>) sign_from_args(<MinElemwise>) is_atom_convex(<MinElemwise>) is_atom_concave(<MinElemwise>) is_atom_log_log_convex(<MinElemwise>) is_atom_log_log_concave(<MinElemwise>) is_incr(<MinElemwise>) is_decr(<MinElemwise>) is_pwl(<MinElemwise>) .grad(<MinElemwise>)

-

The MinElemwise class.

-

MinEntries() to_numeric(<MinEntries>) sign_from_args(<MinEntries>) is_atom_convex(<MinEntries>) is_atom_concave(<MinEntries>) is_atom_log_log_convex(<MinEntries>) is_atom_log_log_concave(<MinEntries>) is_incr(<MinEntries>) is_decr(<MinEntries>) is_pwl(<MinEntries>) .grad(<MinEntries>) .column_grad(<MinEntries>)

-

The MinEntries class.

-

Minimize() canonicalize(<Minimize>) is_dcp(<Minimize>) is_dgp(<Minimize>)

-

The Minimize class.

-

MixedNorm()

-

The MixedNorm atom.

-

`%*%`(<Expression>,<Expression>) `%*%`(<Expression>,<ConstVal>) `%*%`(<ConstVal>,<Expression>) to_numeric(<MulExpression>) dim_from_args(<MulExpression>) is_atom_convex(<MulExpression>) is_atom_concave(<MulExpression>) is_atom_log_log_convex(<MulExpression>) is_atom_log_log_concave(<MulExpression>) is_incr(<MulExpression>) is_decr(<MulExpression>) .grad(<MulExpression>) graph_implementation(<MulExpression>)

-

The MulExpression class.

-

Multiply() to_numeric(<Multiply>) dim_from_args(<Multiply>) is_atom_log_log_convex(<Multiply>) is_atom_log_log_concave(<Multiply>) is_psd(<Multiply>) is_nsd(<Multiply>) graph_implementation(<Multiply>)

-

The Multiply class.

-

Neg()

-

An alias for -MinElemwise(x, 0)

-

`-`(<Expression>,<missing>) `-`(<Expression>,<Expression>) `-`(<Expression>,<ConstVal>) `-`(<ConstVal>,<Expression>) dim_from_args(<NegExpression>) sign_from_args(<NegExpression>) is_incr(<NegExpression>) is_decr(<NegExpression>) is_symmetric(<NegExpression>) is_hermitian(<NegExpression>) graph_implementation(<NegExpression>)

-

The NegExpression class.

-

name(<NonPosConstraint>) is_dcp(<NonPosConstraint>) is_dgp(<NonPosConstraint>) canonicalize(<NonPosConstraint>) residual(<NonPosConstraint>)

-

The NonPosConstraint class

-

NonlinearConstraint()

-

The NonlinearConstraint class.

-

Norm()

-

The Norm atom.

-

Norm1() name(<Norm1>) to_numeric(<Norm1>) allow_complex(<Norm1>) sign_from_args(<Norm1>) is_atom_convex(<Norm1>) is_atom_concave(<Norm1>) is_incr(<Norm1>) is_decr(<Norm1>) is_pwl(<Norm1>) get_data(<Norm1>) .domain(<Norm1>) .grad(<Norm1>) .column_grad(<Norm1>)

-

The Norm1 class.

-

Norm2()

-

The Norm2 atom.

-

name(<NormInf>) to_numeric(<NormInf>) allow_complex(<NormInf>) sign_from_args(<NormInf>) is_atom_convex(<NormInf>) is_atom_concave(<NormInf>) is_atom_log_log_convex(<NormInf>) is_atom_log_log_concave(<NormInf>) is_incr(<NormInf>) is_decr(<NormInf>) is_pwl(<NormInf>) get_data(<NormInf>) .domain(<NormInf>) .grad(<NormInf>) .column_grad(<NormInf>)

-

The NormInf class.

-

NormNuc() to_numeric(<NormNuc>) allow_complex(<NormNuc>) dim_from_args(<NormNuc>) sign_from_args(<NormNuc>) is_atom_convex(<NormNuc>) is_atom_concave(<NormNuc>) is_incr(<NormNuc>) is_decr(<NormNuc>) .grad(<NormNuc>)

-

The NormNuc class.

-

OSQP() status_map(<OSQP>) name(<OSQP>) import_solver(<OSQP>) invert(<OSQP>,<list>,<InverseData>) solve_via_data(<OSQP>)

-

An interface for the OSQP solver.

-

`+`(<Objective>,<numeric>) `+`(<numeric>,<Objective>) `-`(<Minimize>,<missing>) `+`(<Minimize>,<Minimize>) `+`(<Minimize>,<Maximize>) `-`(<Objective>,<Minimize>) `-`(<Objective>,<Maximize>) `-`(<Minimize>,<Objective>) `-`(<Maximize>,<Objective>) `-`(<Objective>,<numeric>) `-`(<numeric>,<Objective>) `*`(<Minimize>,<numeric>) `*`(<Maximize>,<numeric>) `*`(<numeric>,<Minimize>) `*`(<numeric>,<Maximize>) `/`(<Objective>,<numeric>) `-`(<Maximize>,<missing>) `+`(<Maximize>,<Maximize>) `+`(<Maximize>,<Minimize>)

-

Arithmetic Operations on Objectives

-

Objective() value(<Objective>) is_quadratic(<Objective>) is_qpwa(<Objective>)

-

The Objective class.

-

OneMinusPos() name(<OneMinusPos>) to_numeric(<OneMinusPos>) dim_from_args(<OneMinusPos>) sign_from_args(<OneMinusPos>) is_atom_convex(<OneMinusPos>) is_atom_concave(<OneMinusPos>) is_atom_log_log_convex(<OneMinusPos>) is_atom_log_log_concave(<OneMinusPos>) is_incr(<OneMinusPos>) is_decr(<OneMinusPos>) .grad(<OneMinusPos>)

-

The OneMinusPos class.

-

`%>>%` `%<<%` PSDConstraint() name(<PSDConstraint>) is_dcp(<PSDConstraint>) is_dgp(<PSDConstraint>) residual(<PSDConstraint>) canonicalize(<PSDConstraint>)

-

The PSDConstraint class.

-

PSDWrap() is_psd(<PSDWrap>)

-

The PSDWrap class.

-

Parameter() get_data(<Parameter>) name(<Parameter>) value(<Parameter>) `value<-`(<Parameter>) grad(<Parameter>) parameters(<Parameter>) canonicalize(<Parameter>)

-

The Parameter class.

-

PfEigenvalue() name(<PfEigenvalue>) to_numeric(<PfEigenvalue>) dim_from_args(<PfEigenvalue>) sign_from_args(<PfEigenvalue>) is_atom_convex(<PfEigenvalue>) is_atom_concave(<PfEigenvalue>) is_atom_log_log_convex(<PfEigenvalue>) is_atom_log_log_concave(<PfEigenvalue>) is_incr(<PfEigenvalue>) is_decr(<PfEigenvalue>) .grad(<PfEigenvalue>)

-

The PfEigenvalue class.

-

Pnorm() allow_complex(<Pnorm>) to_numeric(<Pnorm>) validate_args(<Pnorm>) sign_from_args(<Pnorm>) is_atom_convex(<Pnorm>) is_atom_concave(<Pnorm>) is_atom_log_log_convex(<Pnorm>) is_atom_log_log_concave(<Pnorm>) is_incr(<Pnorm>) is_decr(<Pnorm>) is_pwl(<Pnorm>) get_data(<Pnorm>) name(<Pnorm>) .domain(<Pnorm>) .grad(<Pnorm>) .column_grad(<Pnorm>)

-

The Pnorm class.

-

Pos()

-

An alias for MaxElemwise(x, 0)

-

Power() to_numeric(<Power>) sign_from_args(<Power>) is_atom_convex(<Power>) is_atom_concave(<Power>) is_atom_log_log_convex(<Power>) is_atom_log_log_concave(<Power>) is_constant(<Power>) is_incr(<Power>) is_decr(<Power>) is_quadratic(<Power>) is_qpwa(<Power>) .grad(<Power>) .domain(<Power>) get_data(<Power>) copy(<Power>) name(<Power>)

-

The Power class.

-

`+`(<Problem>,<missing>) `-`(<Problem>,<missing>) `+`(<Problem>,<numeric>) `+`(<numeric>,<Problem>) `+`(<Problem>,<Problem>) `-`(<Problem>,<numeric>) `-`(<numeric>,<Problem>) `-`(<Problem>,<Problem>) `*`(<Problem>,<numeric>) `*`(<numeric>,<Problem>) `/`(<Problem>,<numeric>)

-

Arithmetic Operations on Problems

-

Problem() objective(<Problem>) `objective<-`(<Problem>) constraints(<Problem>) `constraints<-`(<Problem>) value(<Problem>) `value<-`(<Problem>) status(<Problem>) is_dcp(<Problem>) is_dgp(<Problem>) is_qp(<Problem>) canonicalize(<Problem>) is_mixed_integer(<Problem>) variables(<Problem>) parameters(<Problem>) constants(<Problem>) atoms(<Problem>) size_metrics(<Problem>) solver_stats(<Problem>) `solver_stats<-`(<Problem>) get_problem_data(<Problem>,<character>,<logical>) get_problem_data(<Problem>,<character>,<missing>) unpack_results(<Problem>)

-

The Problem class.

-

ProdEntries() to_numeric(<ProdEntries>) sign_from_args(<ProdEntries>) is_atom_convex(<ProdEntries>) is_atom_concave(<ProdEntries>) is_atom_log_log_convex(<ProdEntries>) is_atom_log_log_concave(<ProdEntries>) is_incr(<ProdEntries>) is_decr(<ProdEntries>) .column_grad(<ProdEntries>) .grad(<ProdEntries>)

-

The ProdEntries class.

-

Promote() to_numeric(<Promote>) is_symmetric(<Promote>) dim_from_args(<Promote>) is_atom_log_log_convex(<Promote>) is_atom_log_log_concave(<Promote>) get_data(<Promote>) graph_implementation(<Promote>)

-

The Promote class.

-

Qp2SymbolicQp-class .Qp2SymbolicQp

-

The Qp2SymbolicQp class.

-

QpMatrixStuffing-class QpMatrixStuffing

-

The QpMatrixStuffing class.

-

accepts(<QpSolver>,<Problem>) perform(<QpSolver>,<Problem>)

-

A QP solver interface.

-

QuadForm() name(<QuadForm>) allow_complex(<QuadForm>) to_numeric(<QuadForm>) validate_args(<QuadForm>) sign_from_args(<QuadForm>) dim_from_args(<QuadForm>) is_atom_convex(<QuadForm>) is_atom_concave(<QuadForm>) is_atom_log_log_convex(<QuadForm>) is_atom_log_log_concave(<QuadForm>) is_incr(<QuadForm>) is_decr(<QuadForm>) is_quadratic(<QuadForm>) is_pwl(<QuadForm>) .grad(<QuadForm>)

-

The QuadForm class.

-

QuadOverLin() allow_complex(<QuadOverLin>) to_numeric(<QuadOverLin>) validate_args(<QuadOverLin>) dim_from_args(<QuadOverLin>) sign_from_args(<QuadOverLin>) is_atom_convex(<QuadOverLin>) is_atom_concave(<QuadOverLin>) is_atom_log_log_convex(<QuadOverLin>) is_atom_log_log_concave(<QuadOverLin>) is_incr(<QuadOverLin>) is_decr(<QuadOverLin>) is_quadratic(<QuadOverLin>) is_qpwa(<QuadOverLin>) .domain(<QuadOverLin>) .grad(<QuadOverLin>)

-

The QuadOverLin class.

-

Rdict() `$`(<Rdict>) length(<Rdict>) is.element(<ANY>,<Rdict>) `[`(<Rdict>,<ANY>,<ANY>,<ANY>) `[<-`(<Rdict>,<ANY>,<ANY>,<ANY>)

-

The Rdict class.

-

Rdictdefault() `[`(<Rdictdefault>,<ANY>,<ANY>,<ANY>)

-

The Rdictdefault class.

-

Real() to_numeric(<Real>) dim_from_args(<Real>) is_imag(<Real>) is_complex(<Real>) is_symmetric(<Real>)

-

The Real class.

-

accepts(<Reduction>,<Problem>) reduce(<Reduction>) retrieve(<Reduction>,<Solution>) perform(<Reduction>,<Problem>) invert(<Reduction>,<Solution>,<list>)

-

The Reduction class.

-

mip_capable(<ReductionSolver>) name(<ReductionSolver>) import_solver(<ReductionSolver>) is_installed(<ReductionSolver>) solve_via_data(<ReductionSolver>) reduction_solve(<ReductionSolver>,<ANY>) solve_via_data(<ECOS>)

-

The ReductionSolver class.

-

Reshape() to_numeric(<Reshape>) validate_args(<Reshape>) dim_from_args(<Reshape>) is_atom_log_log_convex(<Reshape>) is_atom_log_log_concave(<Reshape>) get_data(<Reshape>) graph_implementation(<Reshape>)

-

The Reshape class.

-

SCS() mip_capable(<SCS>) status_map(<SCS>) name(<SCS>) import_solver(<SCS>) reduction_format_constr(<SCS>) perform(<SCS>,<Problem>) invert(<SCS>,<list>,<list>) solve_via_data(<SCS>)

-

An interface for the SCS solver

-

SCS.dims_to_solver_dict()

-

Utility method for formatting a ConeDims instance into a dictionary that can be supplied to SCS.

-

SCS.extract_dual_value()

-

Extracts the dual value for constraint starting at offset.

-

SOC() as.character(<SOC>) residual(<SOC>) get_data(<SOC>) format_constr(<SOC>) num_cones(<SOC>) size(<SOC>) cone_sizes(<SOC>) is_dcp(<SOC>) is_dgp(<SOC>) canonicalize(<SOC>)

-

The SOC class.

-

SOCAxis() as.character(<SOCAxis>) format_constr(<SOCAxis>) num_cones(<SOCAxis>) cone_sizes(<SOCAxis>) size(<SOCAxis>)

-

The SOCAxis class.

-

SigmaMax() to_numeric(<SigmaMax>) allow_complex(<SigmaMax>) dim_from_args(<SigmaMax>) sign_from_args(<SigmaMax>) is_atom_convex(<SigmaMax>) is_atom_concave(<SigmaMax>) is_incr(<SigmaMax>) is_decr(<SigmaMax>) .grad(<SigmaMax>)

-

The SigmaMax class.

-

SizeMetrics()

-

The SizeMetrics class.

-

as.character(<Solution>)

-

The Solution class.

-

SolverStats()

-

The SolverStats class.

-

prepend(<SolvingChain>,<Chain>) reduction_solve(<SolvingChain>,<Problem>) reduction_solve_via_data(<SolvingChain>)

-

The SolvingChain class.

-

`[`(<Expression>,<index>,<missing>,<ANY>) `[`(<Expression>,<missing>,<index>,<ANY>) `[`(<Expression>,<index>,<index>,<ANY>) `[`(<Expression>,<matrix>,<index>,<ANY>) `[`(<Expression>,<index>,<matrix>,<ANY>) `[`(<Expression>,<matrix>,<matrix>,<ANY>) `[`(<Expression>,<matrix>,<missing>,<ANY>) SpecialIndex() name(<SpecialIndex>) is_atom_log_log_convex(<SpecialIndex>) is_atom_log_log_concave(<SpecialIndex>) get_data(<SpecialIndex>) .grad(<SpecialIndex>)

-

The SpecialIndex class.

-

SumEntries() to_numeric(<SumEntries>) is_atom_log_log_convex(<SumEntries>) is_atom_log_log_concave(<SumEntries>) graph_implementation(<SumEntries>)

-

The SumEntries class.

-

SumLargest() to_numeric(<SumLargest>) validate_args(<SumLargest>) dim_from_args(<SumLargest>) sign_from_args(<SumLargest>) is_atom_convex(<SumLargest>) is_atom_concave(<SumLargest>) is_incr(<SumLargest>) is_decr(<SumLargest>) get_data(<SumLargest>) .grad(<SumLargest>)

-

The SumLargest class.

-

SumSmallest()

-

The SumSmallest atom.

-

SumSquares()

-

The SumSquares atom.

-

SymbolicQuadForm() dim_from_args(<SymbolicQuadForm>) sign_from_args(<SymbolicQuadForm>) get_data(<SymbolicQuadForm>) is_atom_convex(<SymbolicQuadForm>) is_atom_concave(<SymbolicQuadForm>) is_incr(<SymbolicQuadForm>) is_decr(<SymbolicQuadForm>) is_quadratic(<SymbolicQuadForm>) .grad(<SymbolicQuadForm>)

-

The SymbolicQuadForm class.

-

TotalVariation()

-

The TotalVariation atom.

-

Trace() to_numeric(<Trace>) validate_args(<Trace>) dim_from_args(<Trace>) is_atom_log_log_convex(<Trace>) is_atom_log_log_concave(<Trace>) graph_implementation(<Trace>)

-

The Trace class.

-

to_numeric(<Transpose>) is_symmetric(<Transpose>) is_hermitian(<Transpose>) dim_from_args(<Transpose>) is_atom_log_log_convex(<Transpose>) is_atom_log_log_concave(<Transpose>) get_data(<Transpose>) graph_implementation(<Transpose>)

-

The Transpose class.

-

name(<UnaryOperator>) to_numeric(<UnaryOperator>)

-

The UnaryOperator class.

-

UpperTri() to_numeric(<UpperTri>) validate_args(<UpperTri>) dim_from_args(<UpperTri>) is_atom_log_log_convex(<UpperTri>) is_atom_log_log_concave(<UpperTri>) graph_implementation(<UpperTri>)

-

The UpperTri class.

-

VStack() to_numeric(<VStack>) validate_args(<VStack>) dim_from_args(<VStack>) is_atom_log_log_convex(<VStack>) is_atom_log_log_concave(<VStack>) graph_implementation(<VStack>)

-

The VStack class.

-

Variable() as.character(<Variable>) name(<Variable>) value(<Variable>) grad(<Variable>) variables(<Variable>) canonicalize(<Variable>)

-

The Variable class.

-

to_numeric(<Wrap>) dim_from_args(<Wrap>) is_atom_log_log_convex(<Wrap>) is_atom_log_log_concave(<Wrap>) graph_implementation(<Wrap>)

-

The Wrap class.

-

name(<ZeroConstraint>) dim(<ZeroConstraint>) is_dcp(<ZeroConstraint>) is_dgp(<ZeroConstraint>) residual(<ZeroConstraint>) canonicalize(<ZeroConstraint>)

-

The ZeroConstraint class

-

abs(<Expression>)

-

Absolute Value

-

accepts()

-

Reduction Acceptance

-

are_args_affine()

-

Are the arguments affine?

-

bmat()

-

Block Matrix

-

canonicalize() canonical_form()

-

Canonicalize

-

cdiac

-

Global Monthly and Annual Temperature Anomalies (degrees C), 1850-2015 (Relative to the 1961-1990 Mean) (May 2016)

-

Re(<Expression>) Im(<Expression>) Conj(<Expression>)

-

Complex Numbers

-

is_real() is_imag() is_complex()

-

Complex Properties

-

num_cones() cone_sizes()

-

Second-Order Cone Methods

-

constr_value()

-

Is Constraint Violated?

-

construct_intermediate_chain(<Problem>,<list>)

-

Builds a chain that rewrites a problem into an intermediate representation suitable for numeric reductions.

-

construct_solving_chain()

-

Build a reduction chain from a problem to an installed solver.

-

conv()

-

Discrete Convolution

-

cummax_axis() cummax(<Expression>)

-

Cumulative Maximum

-

cumsum_axis() cumsum(<Expression>)

-

Cumulative Sum

-

is_atom_convex() is_atom_concave() is_atom_affine() is_atom_log_log_convex(<Atom>) is_atom_log_log_concave(<Atom>) is_atom_log_log_affine(<Atom>)

-

Curvature of an Atom

-

is_incr() is_decr()

-

Curvature of Composition

-

is_constant() is_affine() is_convex() is_concave() is_quadratic() is_pwl() is_qpwa()

-

Curvature Properties

-

curvature()

-

Curvature of Expression

-

cvxr_norm()

-

Matrix Norm (Alternative)

-

diag(<Expression>)

-

Matrix Diagonal

-

diff(<Expression>)

-

Lagged and Iterated Differences

-

dim_from_args()

-

Atom Dimensions

-

domain()

-

Domain

-

.LinOpVector__new()

-

Create a new LinOpVector object.

-

.LinOpVector__push_back()

-

Perform a push back operation on the args field of LinOp

-

.LinOp__args_push_back()

-

Perform a push back operation on the args field of LinOp

-

.LinOp__get_dense_data()

-

Get the field dense_data for the LinOp object

-

.LinOp__get_id()

-

Get the id field of the LinOp Object

-

.LinOp__get_size()

-

Get the field size for the LinOp object

-

.LinOp__get_slice()

-

Get the slice field of the LinOp Object

-

.LinOp__get_sparse()

-

Get the sparse flag field for the LinOp object

-

.LinOp__get_sparse_data()

-

Get the field named sparse_data from the LinOp object

-

.LinOp__get_type()

-

Get the field named type for the LinOp object

-

.LinOp__new()

-

Create a new LinOp object.

-

.LinOp__set_dense_data()

-

Set the field dense_data of the LinOp object

-

.LinOp__set_size()

-

Set the field size of the LinOp object

-

.LinOp__set_slice()

-

Set the slice field of the LinOp Object

-

.LinOp__set_sparse()

-

Set the flag sparse of the LinOp object

-

.LinOp__set_sparse_data()

-

Set the field named sparse_data of the LinOp object

-

.LinOp__set_type()

-

Set the field named type for the LinOp object

-

.LinOp__size_push_back()

-

Perform a push back operation on the size field of LinOp

-

.LinOp__slice_push_back()

-

Perform a push back operation on the slice field of LinOp

-

.LinOp_at_index()

-

Return the LinOp element at index i (0-based)

-

.ProblemData__get_I()

-

Get the I field of the ProblemData Object

-

.ProblemData__get_J()

-

Get the J field of the ProblemData Object

-

.ProblemData__get_V()

-

Get the V field of the ProblemData Object

-

.ProblemData__get_const_to_row()

-

Get the const_to_row field of the ProblemData Object

-

.ProblemData__get_const_vec()

-

Get the const_vec field from the ProblemData Object

-

.ProblemData__get_id_to_col()

-

Get the id_to_col field of the ProblemData Object

-

.ProblemData__new()

-

Create a new ProblemData object.

-

.ProblemData__set_I()

-

Set the I field in the ProblemData Object

-

.ProblemData__set_J()

-

Set the J field in the ProblemData Object

-

.ProblemData__set_V()

-

Set the V field in the ProblemData Object

-

.ProblemData__set_const_to_row()

-

Set the const_to_row map of the ProblemData Object

-

.ProblemData__set_const_vec()

-

Set the const_vec field in the ProblemData Object

-

.ProblemData__set_id_to_col()

-

Set the id_to_col field of the ProblemData Object

-

.build_matrix_0()

-

Get the sparse flag field for the LinOp object

-

.build_matrix_1()

-

Get the sparse flag field for the LinOp object

-

.decomp_quad()

-

Compute a Matrix Decomposition.

-

.p_norm()

-

Internal method for calculating the p-norm

-

dspop

-

Direct Standardization: Population

-

dssamp

-

Direct Standardization: Sample

-

dual_value() `dual_value<-`()

-

Get and Set Dual Value

-

entr()

-

Entropy Function

-

exp(<Expression>)

-

Natural Exponential

-

variables() parameters() constants() atoms()

-

Parts of an Expression Leaf

-

extract_dual_value()

-

Gets a specified value of a dual variable.

-

extract_mip_idx()

-

Coalesces bool, int indices for variables.

-

eye_minus_inv()

-

Unity Resolvent

-

format_constr()

-

Format Constraints

-

geo_mean()

-

Geometric Mean

-

get_data()

-

Get Expression Data

-

get_dual_values()

-

Gets the values of the dual variables.

-

get_id()

-

Get ID

-

get_np()

-

Get numpy handle

-

get_problem_data()

-

Get Problem Data

-

get_sp()

-

Get scipy handle

-

grad()

-

Sub/Super-Gradient

-

graph_implementation()

-

Graph Implementation

-

group_constraints()

-

Organize the constraints into a dictionary keyed by constraint names.

-

harmonic_mean()

-

Harmonic Mean

-

hstack()

-

Horizontal Concatenation

-

huber()

-

Huber Function

-

id()

-

Identification Number

-

import_solver()

-

Import Solver

-

installed_solvers() add_to_solver_blacklist() remove_from_solver_blacklist() set_solver_blacklist()

-

List installed solvers

-

inv_pos()

-

Reciprocal Function

-

invert()

-

Return Original Solution

-

is_dcp()

-

DCP Compliance

-

is_dgp()

-

DGP Compliance

-

is_mixed_integer()

-

Is Problem Mixed Integer?

-

is_qp()

-

Is Problem a QP?

-

is_stuffed_cone_constraint()

-

Is the constraint a stuffed cone constraint?

-

is_stuffed_cone_objective()

-

Is the objective a stuffed cone objective?

-

is_stuffed_qp_objective()

-

Is the QP objective stuffed?

-

kl_div()

-

Kullback-Leibler Divergence

-

kronecker(<Expression>,<ANY>) kronecker(<ANY>,<Expression>)

-

Kronecker Product

-

lambda_max()

-

Maximum Eigenvalue

-

lambda_min()

-

Minimum Eigenvalue

-

lambda_sum_largest()

-

Sum of Largest Eigenvalues

-

lambda_sum_smallest()

-

Sum of Smallest Eigenvalues

-

is_pos() is_neg()

-

Attributes of an Expression Leaf

-

linearize()

-

Affine Approximation to an Expression

-

log(<Expression>) log10(<Expression>) log2(<Expression>) log1p(<Expression>)

-

Logarithms

-

log_det()

-

Log-Determinant

-

is_atom_log_log_convex() is_atom_log_log_concave() is_atom_log_log_affine()

-

Log-Log Curvature of an Atom

-

is_log_log_constant() is_log_log_affine() is_log_log_convex() is_log_log_concave()

-

Log-Log Curvature Properties

-

log_log_curvature()

-

Log-Log Curvature of Expression

-

log_sum_exp()

-

Log-Sum-Exponential

-

logistic()

-

Logistic Function

-

make_sparse_diagonal_matrix()

-

Make a CSC sparse diagonal matrix

-

matrix_frac()

-

Matrix Fraction

-

is_psd() is_nsd() is_hermitian() is_symmetric()

-

Matrix Properties

-

matrix_trace()

-

Matrix Trace

-

max_elemwise()

-

Elementwise Maximum

-

max_entries() max(<Expression>)

-

Maximum

-

mean(<Expression>)

-

Arithmetic Mean

-

min_elemwise()

-

Elementwise Minimum

-

min_entries() min(<Expression>)

-

Minimum

-

mip_capable()

-

Solver Capabilities

-

mixed_norm()

-

Mixed Norm

-

`*`(<Expression>,<Expression>) `*`(<Expression>,<ConstVal>) `*`(<ConstVal>,<Expression>)

-

Elementwise multiplication operator

-

multiply()

-

Elementwise Multiplication

-

name()

-

Variable, Parameter, or Expression Name

-

neg()

-

Elementwise Negative

-

norm(<Expression>,<character>)

-

Matrix Norm

-

norm1()

-

1-Norm

-

norm2()

-

Euclidean Norm

-

norm_inf()

-

Infinity-Norm

-

norm_nuc()

-

Nuclear Norm

-

one_minus_pos()

-

Difference on Restricted Domain

-

p_norm()

-

P-Norm

-

perform()

-

Perform Reduction

-

pf_eigenvalue()

-

Perron-Frobenius Eigenvalue

-

pos()

-

Elementwise Positive

-

`^`(<Expression>,<numeric>) power()

-

Elementwise Power

-

objective() `objective<-`() constraints() `constraints<-`() size_metrics()

-

Parts of a Problem

-

prod_entries() prod(<Expression>)

-

Product of Entries

-

project() project_and_assign()

-

Project Value

-

psd_coeff_offset()

-

Given a problem returns a PSD constraint

-

psolve() solve(<Problem>,<ANY>)

-

Solve a DCP Problem

-

quad_form()

-

Quadratic Form

-

quad_over_lin()

-

Quadratic over Linear

-

reduce()

-

Reduce a Problem

-

resetOptions()

-

Reset Options

-

reshape_expr()

-

Reshape an Expression

-

residual() violation()

-

Constraint Residual

-

retrieve()

-

Retrieve Solution

-

scaled_lower_tri()

-

Utility methods for special handling of semidefinite constraints.

-

scaled_upper_tri()

-

Utility methods for special handling of semidefinite constraints.

-

scalene()

-

Scalene Function

-

setIdCounter()

-

Set ID Counter

-

sigma_max()

-

Maximum Singular Value

-

is_zero() is_nonneg() is_nonpos()

-

Sign Properties

-

sign(<Expression>)

-

Sign of Expression

-

sign_from_args()

-

Atom Sign

-

is_scalar() is_vector() is_matrix()

-

Size Properties

-

size()

-

Size of Expression

-

sqrt(<Expression>)

-

Square Root

-

square(<Expression>)

-

Square

-

sum_entries() sum(<Expression>)

-

Sum of Entries

-

sum_largest()

-

Sum of Largest Values

-

sum_smallest()

-

Sum of Smallest Values

-

sum_squares()

-

Sum of Squares

-

to_numeric()

-

Numeric Value of Atom

-

t(<Expression>)

-

Matrix Transpose

-

tri_to_full()

-

Expands lower triangular to full matrix.

-

triu_to_full()

-

Expands upper triangular to full matrix.

-

tv()

-

Total Variation

-

unpack_results()

-

Parse output from a solver and updates problem state

-

updated_scaled_lower_tri()

-

Utility methods for special handling of semidefinite constraints.

-

upper_tri()

-

Upper Triangle of a Matrix

-

validate_args()

-

Validate Arguments

-

validate_val()

-

Validate Value

-

value() `value<-`()

-

Get or Set Value

-

vec()

-

Vectorization of a Matrix

-

vectorized_lower_tri_to_mat()

-

Turns symmetric 2D array into a lower triangular matrix

-

vstack()

-

Vertical Concatenation

- - -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/installed_solvers.html b/docs/reference/installed_solvers.html index 8505d696..426d96a3 100644 --- a/docs/reference/installed_solvers.html +++ b/docs/reference/installed_solvers.html @@ -1,10 +1,10 @@ List installed solvers — installed_solvers • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -79,22 +79,20 @@

List installed solvers

Arguments

-
solvers
+ + +
solvers

a character vector of solver names, default character(0)

Value

- - -

The names of all the installed solvers as a character vector.

- - +

The names of all the installed solvers as a character vector.

The current blacklist (character vector), invisibly.

Functions

- +
  • add_to_solver_blacklist(): Add to solver blacklist, useful for temporarily disabling a solver

  • remove_from_solver_blacklist(): Remove solvers from blacklist

  • set_solver_blacklist(): Set solver blacklist to a value

  • @@ -112,15 +110,15 @@

    Functions

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/inv_pos.html b/docs/reference/inv_pos.html index e2ded40d..09e8c555 100644 --- a/docs/reference/inv_pos.html +++ b/docs/reference/inv_pos.html @@ -1,9 +1,9 @@ -Reciprocal Function — inv_pos • CVXRReciprocal Function — inv_pos • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Reciprocal Function

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

Value

- - -

An Expression representing the reciprocal of the input.

+

An Expression representing the reciprocal of the input.

@@ -104,15 +104,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/invert,CBC_CONIC,list,list-method.html b/docs/reference/invert,CBC_CONIC,list,list-method.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/invert,CBC_CONIC,list,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,CLARABEL,list,list-method.html b/docs/reference/invert,CLARABEL,list,list-method.html new file mode 100644 index 00000000..7b9f7df2 --- /dev/null +++ b/docs/reference/invert,CLARABEL,list,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,CPLEX_CONIC,list,list-method.html b/docs/reference/invert,CPLEX_CONIC,list,list-method.html new file mode 100644 index 00000000..4665af60 --- /dev/null +++ b/docs/reference/invert,CPLEX_CONIC,list,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,CPLEX_QP,list,InverseData-method.html b/docs/reference/invert,CPLEX_QP,list,InverseData-method.html new file mode 100644 index 00000000..a63ea235 --- /dev/null +++ b/docs/reference/invert,CPLEX_QP,list,InverseData-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,CVXOPT,list,list-method.html b/docs/reference/invert,CVXOPT,list,list-method.html new file mode 100644 index 00000000..8a01311e --- /dev/null +++ b/docs/reference/invert,CVXOPT,list,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,Canonicalization,Solution,InverseData-method.html b/docs/reference/invert,Canonicalization,Solution,InverseData-method.html new file mode 100644 index 00000000..2887cd44 --- /dev/null +++ b/docs/reference/invert,Canonicalization,Solution,InverseData-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,Chain,SolutionORList,list-method.html b/docs/reference/invert,Chain,SolutionORList,list-method.html new file mode 100644 index 00000000..b79652f0 --- /dev/null +++ b/docs/reference/invert,Chain,SolutionORList,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,Complex2Real,Solution,InverseData-method.html b/docs/reference/invert,Complex2Real,Solution,InverseData-method.html new file mode 100644 index 00000000..15645f58 --- /dev/null +++ b/docs/reference/invert,Complex2Real,Solution,InverseData-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,ConicSolver,Solution,InverseData-method.html b/docs/reference/invert,ConicSolver,Solution,InverseData-method.html new file mode 100644 index 00000000..0143e4e5 --- /dev/null +++ b/docs/reference/invert,ConicSolver,Solution,InverseData-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,ConstantSolver,Solution,list-method.html b/docs/reference/invert,ConstantSolver,Solution,list-method.html new file mode 100644 index 00000000..563daa80 --- /dev/null +++ b/docs/reference/invert,ConstantSolver,Solution,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,CvxAttr2Constr,Solution,list-method.html b/docs/reference/invert,CvxAttr2Constr,Solution,list-method.html new file mode 100644 index 00000000..86e93a93 --- /dev/null +++ b/docs/reference/invert,CvxAttr2Constr,Solution,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,Dgp2Dcp,Solution,InverseData-method.html b/docs/reference/invert,Dgp2Dcp,Solution,InverseData-method.html new file mode 100644 index 00000000..97140cbd --- /dev/null +++ b/docs/reference/invert,Dgp2Dcp,Solution,InverseData-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,ECOS,list,list-method.html b/docs/reference/invert,ECOS,list,list-method.html new file mode 100644 index 00000000..35ec5a21 --- /dev/null +++ b/docs/reference/invert,ECOS,list,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,EvalParams,Solution,list-method.html b/docs/reference/invert,EvalParams,Solution,list-method.html new file mode 100644 index 00000000..2b6d9ea4 --- /dev/null +++ b/docs/reference/invert,EvalParams,Solution,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,FlipObjective,Solution,list-method.html b/docs/reference/invert,FlipObjective,Solution,list-method.html new file mode 100644 index 00000000..2195cea9 --- /dev/null +++ b/docs/reference/invert,FlipObjective,Solution,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,GLPK,list,list-method.html b/docs/reference/invert,GLPK,list,list-method.html new file mode 100644 index 00000000..b74a96a9 --- /dev/null +++ b/docs/reference/invert,GLPK,list,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,GUROBI_CONIC,list,list-method.html b/docs/reference/invert,GUROBI_CONIC,list,list-method.html new file mode 100644 index 00000000..f4a1f642 --- /dev/null +++ b/docs/reference/invert,GUROBI_CONIC,list,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,GUROBI_QP,list,InverseData-method.html b/docs/reference/invert,GUROBI_QP,list,InverseData-method.html new file mode 100644 index 00000000..de519b9c --- /dev/null +++ b/docs/reference/invert,GUROBI_QP,list,InverseData-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,MOSEK,ANY,ANY-method.html b/docs/reference/invert,MOSEK,ANY,ANY-method.html new file mode 100644 index 00000000..4b67fe4e --- /dev/null +++ b/docs/reference/invert,MOSEK,ANY,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,MatrixStuffing,Solution,InverseData-method.html b/docs/reference/invert,MatrixStuffing,Solution,InverseData-method.html new file mode 100644 index 00000000..5d19b3c7 --- /dev/null +++ b/docs/reference/invert,MatrixStuffing,Solution,InverseData-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,OSQP,list,InverseData-method.html b/docs/reference/invert,OSQP,list,InverseData-method.html new file mode 100644 index 00000000..898d17aa --- /dev/null +++ b/docs/reference/invert,OSQP,list,InverseData-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,Reduction,Solution,list-method.html b/docs/reference/invert,Reduction,Solution,list-method.html new file mode 100644 index 00000000..7befebea --- /dev/null +++ b/docs/reference/invert,Reduction,Solution,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert,SCS,list,list-method.html b/docs/reference/invert,SCS,list,list-method.html new file mode 100644 index 00000000..5e0523ec --- /dev/null +++ b/docs/reference/invert,SCS,list,list-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/invert.html b/docs/reference/invert.html index 11709aeb..e1276fa2 100644 --- a/docs/reference/invert.html +++ b/docs/reference/invert.html @@ -1,9 +1,9 @@ -Return Original Solution — invert • CVXRReturn Original Solution — invert • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Return Original Solution

Arguments

-
object
+ + +
object

A Reduction object.

-
solution
+
solution

A Solution to a problem that generated inverse_data.

-
inverse_data
+
inverse_data

A InverseData object encoding the original problem.

Value

- - -

A Solution to the original problem.

+

A Solution to the original problem.

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/is.element,ANY,Rdict-method.html b/docs/reference/is.element,ANY,Rdict-method.html new file mode 100644 index 00000000..aa0a0d7c --- /dev/null +++ b/docs/reference/is.element,ANY,Rdict-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_affine,Expression-method.html b/docs/reference/is_affine,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_affine,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_affine.html b/docs/reference/is_affine.html new file mode 100644 index 00000000..53bfddbd --- /dev/null +++ b/docs/reference/is_affine.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_affine,Atom-method.html b/docs/reference/is_atom_affine,Atom-method.html new file mode 100644 index 00000000..d30eec08 --- /dev/null +++ b/docs/reference/is_atom_affine,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_affine.html b/docs/reference/is_atom_affine.html new file mode 100644 index 00000000..d30eec08 --- /dev/null +++ b/docs/reference/is_atom_affine.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,Abs-method.html b/docs/reference/is_atom_concave,Abs-method.html new file mode 100644 index 00000000..6bc6fe74 --- /dev/null +++ b/docs/reference/is_atom_concave,Abs-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,AffAtom-method.html b/docs/reference/is_atom_concave,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_atom_concave,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,Atom-method.html b/docs/reference/is_atom_concave,Atom-method.html new file mode 100644 index 00000000..d30eec08 --- /dev/null +++ b/docs/reference/is_atom_concave,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,CumMax-method.html b/docs/reference/is_atom_concave,CumMax-method.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/is_atom_concave,CumMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,DivExpression-method.html b/docs/reference/is_atom_concave,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/is_atom_concave,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,Entr-method.html b/docs/reference/is_atom_concave,Entr-method.html new file mode 100644 index 00000000..2d645861 --- /dev/null +++ b/docs/reference/is_atom_concave,Entr-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,Exp-method.html b/docs/reference/is_atom_concave,Exp-method.html new file mode 100644 index 00000000..ddba19b6 --- /dev/null +++ b/docs/reference/is_atom_concave,Exp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,EyeMinusInv-method.html b/docs/reference/is_atom_concave,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/is_atom_concave,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,GeoMean-method.html b/docs/reference/is_atom_concave,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/is_atom_concave,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,Huber-method.html b/docs/reference/is_atom_concave,Huber-method.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/is_atom_concave,Huber-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,KLDiv-method.html b/docs/reference/is_atom_concave,KLDiv-method.html new file mode 100644 index 00000000..fa937a81 --- /dev/null +++ b/docs/reference/is_atom_concave,KLDiv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,LambdaMax-method.html b/docs/reference/is_atom_concave,LambdaMax-method.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/is_atom_concave,LambdaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,Log-method.html b/docs/reference/is_atom_concave,Log-method.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/is_atom_concave,Log-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,LogDet-method.html b/docs/reference/is_atom_concave,LogDet-method.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/is_atom_concave,LogDet-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,LogSumExp-method.html b/docs/reference/is_atom_concave,LogSumExp-method.html new file mode 100644 index 00000000..994650e9 --- /dev/null +++ b/docs/reference/is_atom_concave,LogSumExp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,Logistic-method.html b/docs/reference/is_atom_concave,Logistic-method.html new file mode 100644 index 00000000..cf33b8ec --- /dev/null +++ b/docs/reference/is_atom_concave,Logistic-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,MatrixFrac-method.html b/docs/reference/is_atom_concave,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/is_atom_concave,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,MaxElemwise-method.html b/docs/reference/is_atom_concave,MaxElemwise-method.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/is_atom_concave,MaxElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,MaxEntries-method.html b/docs/reference/is_atom_concave,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/is_atom_concave,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,MinElemwise-method.html b/docs/reference/is_atom_concave,MinElemwise-method.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/is_atom_concave,MinElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,MinEntries-method.html b/docs/reference/is_atom_concave,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/is_atom_concave,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,MulExpression-method.html b/docs/reference/is_atom_concave,MulExpression-method.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/is_atom_concave,MulExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,Norm1-method.html b/docs/reference/is_atom_concave,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/is_atom_concave,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,NormInf-method.html b/docs/reference/is_atom_concave,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/is_atom_concave,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,NormNuc-method.html b/docs/reference/is_atom_concave,NormNuc-method.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/is_atom_concave,NormNuc-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,OneMinusPos-method.html b/docs/reference/is_atom_concave,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/is_atom_concave,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,PfEigenvalue-method.html b/docs/reference/is_atom_concave,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/is_atom_concave,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,Pnorm-method.html b/docs/reference/is_atom_concave,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/is_atom_concave,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,Power-method.html b/docs/reference/is_atom_concave,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/is_atom_concave,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,ProdEntries-method.html b/docs/reference/is_atom_concave,ProdEntries-method.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/is_atom_concave,ProdEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,QuadForm-method.html b/docs/reference/is_atom_concave,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/is_atom_concave,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,QuadOverLin-method.html b/docs/reference/is_atom_concave,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/is_atom_concave,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,SigmaMax-method.html b/docs/reference/is_atom_concave,SigmaMax-method.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/is_atom_concave,SigmaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,SumLargest-method.html b/docs/reference/is_atom_concave,SumLargest-method.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/is_atom_concave,SumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave,SymbolicQuadForm-method.html b/docs/reference/is_atom_concave,SymbolicQuadForm-method.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/is_atom_concave,SymbolicQuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_concave.html b/docs/reference/is_atom_concave.html new file mode 100644 index 00000000..d30eec08 --- /dev/null +++ b/docs/reference/is_atom_concave.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,Abs-method.html b/docs/reference/is_atom_convex,Abs-method.html new file mode 100644 index 00000000..6bc6fe74 --- /dev/null +++ b/docs/reference/is_atom_convex,Abs-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,AffAtom-method.html b/docs/reference/is_atom_convex,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_atom_convex,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,Atom-method.html b/docs/reference/is_atom_convex,Atom-method.html new file mode 100644 index 00000000..d30eec08 --- /dev/null +++ b/docs/reference/is_atom_convex,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,CumMax-method.html b/docs/reference/is_atom_convex,CumMax-method.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/is_atom_convex,CumMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,DivExpression-method.html b/docs/reference/is_atom_convex,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/is_atom_convex,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,Entr-method.html b/docs/reference/is_atom_convex,Entr-method.html new file mode 100644 index 00000000..2d645861 --- /dev/null +++ b/docs/reference/is_atom_convex,Entr-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,Exp-method.html b/docs/reference/is_atom_convex,Exp-method.html new file mode 100644 index 00000000..ddba19b6 --- /dev/null +++ b/docs/reference/is_atom_convex,Exp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,EyeMinusInv-method.html b/docs/reference/is_atom_convex,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/is_atom_convex,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,GeoMean-method.html b/docs/reference/is_atom_convex,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/is_atom_convex,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,Huber-method.html b/docs/reference/is_atom_convex,Huber-method.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/is_atom_convex,Huber-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,KLDiv-method.html b/docs/reference/is_atom_convex,KLDiv-method.html new file mode 100644 index 00000000..fa937a81 --- /dev/null +++ b/docs/reference/is_atom_convex,KLDiv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,LambdaMax-method.html b/docs/reference/is_atom_convex,LambdaMax-method.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/is_atom_convex,LambdaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,Log-method.html b/docs/reference/is_atom_convex,Log-method.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/is_atom_convex,Log-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,LogDet-method.html b/docs/reference/is_atom_convex,LogDet-method.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/is_atom_convex,LogDet-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,LogSumExp-method.html b/docs/reference/is_atom_convex,LogSumExp-method.html new file mode 100644 index 00000000..994650e9 --- /dev/null +++ b/docs/reference/is_atom_convex,LogSumExp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,Logistic-method.html b/docs/reference/is_atom_convex,Logistic-method.html new file mode 100644 index 00000000..cf33b8ec --- /dev/null +++ b/docs/reference/is_atom_convex,Logistic-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,MatrixFrac-method.html b/docs/reference/is_atom_convex,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/is_atom_convex,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,MaxElemwise-method.html b/docs/reference/is_atom_convex,MaxElemwise-method.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/is_atom_convex,MaxElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,MaxEntries-method.html b/docs/reference/is_atom_convex,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/is_atom_convex,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,MinElemwise-method.html b/docs/reference/is_atom_convex,MinElemwise-method.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/is_atom_convex,MinElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,MinEntries-method.html b/docs/reference/is_atom_convex,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/is_atom_convex,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,MulExpression-method.html b/docs/reference/is_atom_convex,MulExpression-method.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/is_atom_convex,MulExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,Norm1-method.html b/docs/reference/is_atom_convex,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/is_atom_convex,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,NormInf-method.html b/docs/reference/is_atom_convex,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/is_atom_convex,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,NormNuc-method.html b/docs/reference/is_atom_convex,NormNuc-method.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/is_atom_convex,NormNuc-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,OneMinusPos-method.html b/docs/reference/is_atom_convex,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/is_atom_convex,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,PfEigenvalue-method.html b/docs/reference/is_atom_convex,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/is_atom_convex,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,Pnorm-method.html b/docs/reference/is_atom_convex,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/is_atom_convex,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,Power-method.html b/docs/reference/is_atom_convex,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/is_atom_convex,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,ProdEntries-method.html b/docs/reference/is_atom_convex,ProdEntries-method.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/is_atom_convex,ProdEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,QuadForm-method.html b/docs/reference/is_atom_convex,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/is_atom_convex,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,QuadOverLin-method.html b/docs/reference/is_atom_convex,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/is_atom_convex,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,SigmaMax-method.html b/docs/reference/is_atom_convex,SigmaMax-method.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/is_atom_convex,SigmaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,SumLargest-method.html b/docs/reference/is_atom_convex,SumLargest-method.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/is_atom_convex,SumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex,SymbolicQuadForm-method.html b/docs/reference/is_atom_convex,SymbolicQuadForm-method.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/is_atom_convex,SymbolicQuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_convex.html b/docs/reference/is_atom_convex.html new file mode 100644 index 00000000..d30eec08 --- /dev/null +++ b/docs/reference/is_atom_convex.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_affine,Atom-method.html b/docs/reference/is_atom_log_log_affine,Atom-method.html new file mode 100644 index 00000000..d30eec08 --- /dev/null +++ b/docs/reference/is_atom_log_log_affine,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_affine.html b/docs/reference/is_atom_log_log_affine.html new file mode 100644 index 00000000..23101cb3 --- /dev/null +++ b/docs/reference/is_atom_log_log_affine.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,AddExpression-method.html b/docs/reference/is_atom_log_log_concave,AddExpression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,AddExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Atom-method.html b/docs/reference/is_atom_log_log_concave,Atom-method.html new file mode 100644 index 00000000..d30eec08 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,DiagMat-method.html b/docs/reference/is_atom_log_log_concave,DiagMat-method.html new file mode 100644 index 00000000..c7ee6a1c --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,DiagMat-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,DiagVec-method.html b/docs/reference/is_atom_log_log_concave,DiagVec-method.html new file mode 100644 index 00000000..13c5eb42 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,DiagVec-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,DivExpression-method.html b/docs/reference/is_atom_log_log_concave,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Exp-method.html b/docs/reference/is_atom_log_log_concave,Exp-method.html new file mode 100644 index 00000000..ddba19b6 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Exp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,EyeMinusInv-method.html b/docs/reference/is_atom_log_log_concave,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,GeoMean-method.html b/docs/reference/is_atom_log_log_concave,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,HStack-method.html b/docs/reference/is_atom_log_log_concave,HStack-method.html new file mode 100644 index 00000000..306a2fec --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,HStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Index-method.html b/docs/reference/is_atom_log_log_concave,Index-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Index-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Log-method.html b/docs/reference/is_atom_log_log_concave,Log-method.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Log-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,MaxElemwise-method.html b/docs/reference/is_atom_log_log_concave,MaxElemwise-method.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,MaxElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,MaxEntries-method.html b/docs/reference/is_atom_log_log_concave,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,MinElemwise-method.html b/docs/reference/is_atom_log_log_concave,MinElemwise-method.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,MinElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,MinEntries-method.html b/docs/reference/is_atom_log_log_concave,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,MulExpression-method.html b/docs/reference/is_atom_log_log_concave,MulExpression-method.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,MulExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Multiply-method.html b/docs/reference/is_atom_log_log_concave,Multiply-method.html new file mode 100644 index 00000000..99f85b11 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Multiply-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,NormInf-method.html b/docs/reference/is_atom_log_log_concave,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,OneMinusPos-method.html b/docs/reference/is_atom_log_log_concave,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,PfEigenvalue-method.html b/docs/reference/is_atom_log_log_concave,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Pnorm-method.html b/docs/reference/is_atom_log_log_concave,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Power-method.html b/docs/reference/is_atom_log_log_concave,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,ProdEntries-method.html b/docs/reference/is_atom_log_log_concave,ProdEntries-method.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,ProdEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Promote-method.html b/docs/reference/is_atom_log_log_concave,Promote-method.html new file mode 100644 index 00000000..3454ffa2 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Promote-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,QuadForm-method.html b/docs/reference/is_atom_log_log_concave,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,QuadOverLin-method.html b/docs/reference/is_atom_log_log_concave,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Reshape-method.html b/docs/reference/is_atom_log_log_concave,Reshape-method.html new file mode 100644 index 00000000..cbc7c98b --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Reshape-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,SpecialIndex-method.html b/docs/reference/is_atom_log_log_concave,SpecialIndex-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,SpecialIndex-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,SumEntries-method.html b/docs/reference/is_atom_log_log_concave,SumEntries-method.html new file mode 100644 index 00000000..4b2e8863 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,SumEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Trace-method.html b/docs/reference/is_atom_log_log_concave,Trace-method.html new file mode 100644 index 00000000..4a1e58a1 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Trace-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Transpose-method.html b/docs/reference/is_atom_log_log_concave,Transpose-method.html new file mode 100644 index 00000000..6d90f546 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Transpose-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,UpperTri-method.html b/docs/reference/is_atom_log_log_concave,UpperTri-method.html new file mode 100644 index 00000000..0d5027f1 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,UpperTri-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,VStack-method.html b/docs/reference/is_atom_log_log_concave,VStack-method.html new file mode 100644 index 00000000..736da1a4 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,VStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave,Wrap-method.html b/docs/reference/is_atom_log_log_concave,Wrap-method.html new file mode 100644 index 00000000..e1ae511d --- /dev/null +++ b/docs/reference/is_atom_log_log_concave,Wrap-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_concave.html b/docs/reference/is_atom_log_log_concave.html new file mode 100644 index 00000000..23101cb3 --- /dev/null +++ b/docs/reference/is_atom_log_log_concave.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,AddExpression-method.html b/docs/reference/is_atom_log_log_convex,AddExpression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,AddExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Atom-method.html b/docs/reference/is_atom_log_log_convex,Atom-method.html new file mode 100644 index 00000000..d30eec08 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,DiagMat-method.html b/docs/reference/is_atom_log_log_convex,DiagMat-method.html new file mode 100644 index 00000000..c7ee6a1c --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,DiagMat-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,DiagVec-method.html b/docs/reference/is_atom_log_log_convex,DiagVec-method.html new file mode 100644 index 00000000..13c5eb42 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,DiagVec-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,DivExpression-method.html b/docs/reference/is_atom_log_log_convex,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Exp-method.html b/docs/reference/is_atom_log_log_convex,Exp-method.html new file mode 100644 index 00000000..ddba19b6 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Exp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,EyeMinusInv-method.html b/docs/reference/is_atom_log_log_convex,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,GeoMean-method.html b/docs/reference/is_atom_log_log_convex,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,HStack-method.html b/docs/reference/is_atom_log_log_convex,HStack-method.html new file mode 100644 index 00000000..306a2fec --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,HStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Index-method.html b/docs/reference/is_atom_log_log_convex,Index-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Index-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Log-method.html b/docs/reference/is_atom_log_log_convex,Log-method.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Log-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,MaxElemwise-method.html b/docs/reference/is_atom_log_log_convex,MaxElemwise-method.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,MaxElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,MaxEntries-method.html b/docs/reference/is_atom_log_log_convex,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,MinElemwise-method.html b/docs/reference/is_atom_log_log_convex,MinElemwise-method.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,MinElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,MinEntries-method.html b/docs/reference/is_atom_log_log_convex,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,MulExpression-method.html b/docs/reference/is_atom_log_log_convex,MulExpression-method.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,MulExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Multiply-method.html b/docs/reference/is_atom_log_log_convex,Multiply-method.html new file mode 100644 index 00000000..99f85b11 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Multiply-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,NormInf-method.html b/docs/reference/is_atom_log_log_convex,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,OneMinusPos-method.html b/docs/reference/is_atom_log_log_convex,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,PfEigenvalue-method.html b/docs/reference/is_atom_log_log_convex,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Pnorm-method.html b/docs/reference/is_atom_log_log_convex,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Power-method.html b/docs/reference/is_atom_log_log_convex,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,ProdEntries-method.html b/docs/reference/is_atom_log_log_convex,ProdEntries-method.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,ProdEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Promote-method.html b/docs/reference/is_atom_log_log_convex,Promote-method.html new file mode 100644 index 00000000..3454ffa2 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Promote-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,QuadForm-method.html b/docs/reference/is_atom_log_log_convex,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,QuadOverLin-method.html b/docs/reference/is_atom_log_log_convex,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Reshape-method.html b/docs/reference/is_atom_log_log_convex,Reshape-method.html new file mode 100644 index 00000000..cbc7c98b --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Reshape-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,SpecialIndex-method.html b/docs/reference/is_atom_log_log_convex,SpecialIndex-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,SpecialIndex-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,SumEntries-method.html b/docs/reference/is_atom_log_log_convex,SumEntries-method.html new file mode 100644 index 00000000..4b2e8863 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,SumEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Trace-method.html b/docs/reference/is_atom_log_log_convex,Trace-method.html new file mode 100644 index 00000000..4a1e58a1 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Trace-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Transpose-method.html b/docs/reference/is_atom_log_log_convex,Transpose-method.html new file mode 100644 index 00000000..6d90f546 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Transpose-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,UpperTri-method.html b/docs/reference/is_atom_log_log_convex,UpperTri-method.html new file mode 100644 index 00000000..0d5027f1 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,UpperTri-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,VStack-method.html b/docs/reference/is_atom_log_log_convex,VStack-method.html new file mode 100644 index 00000000..736da1a4 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,VStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex,Wrap-method.html b/docs/reference/is_atom_log_log_convex,Wrap-method.html new file mode 100644 index 00000000..e1ae511d --- /dev/null +++ b/docs/reference/is_atom_log_log_convex,Wrap-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_atom_log_log_convex.html b/docs/reference/is_atom_log_log_convex.html new file mode 100644 index 00000000..23101cb3 --- /dev/null +++ b/docs/reference/is_atom_log_log_convex.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_complex,AffAtom-method.html b/docs/reference/is_complex,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_complex,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_complex,Atom-method.html b/docs/reference/is_complex,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/is_complex,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_complex,BinaryOperator-method.html b/docs/reference/is_complex,BinaryOperator-method.html new file mode 100644 index 00000000..0ce00269 --- /dev/null +++ b/docs/reference/is_complex,BinaryOperator-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_complex,Constant-method.html b/docs/reference/is_complex,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/is_complex,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_complex,Constraint-method.html b/docs/reference/is_complex,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/is_complex,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_complex,Expression-method.html b/docs/reference/is_complex,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_complex,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_complex,Imag-method.html b/docs/reference/is_complex,Imag-method.html new file mode 100644 index 00000000..162e57af --- /dev/null +++ b/docs/reference/is_complex,Imag-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_complex,Leaf-method.html b/docs/reference/is_complex,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_complex,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_complex,Real-method.html b/docs/reference/is_complex,Real-method.html new file mode 100644 index 00000000..80f9cd35 --- /dev/null +++ b/docs/reference/is_complex,Real-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_complex.html b/docs/reference/is_complex.html new file mode 100644 index 00000000..f96cc8df --- /dev/null +++ b/docs/reference/is_complex.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_concave,Atom-method.html b/docs/reference/is_concave,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/is_concave,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_concave,Expression-method.html b/docs/reference/is_concave,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_concave,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_concave,Leaf-method.html b/docs/reference/is_concave,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_concave,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_concave.html b/docs/reference/is_concave.html new file mode 100644 index 00000000..53bfddbd --- /dev/null +++ b/docs/reference/is_concave.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_constant,Expression-method.html b/docs/reference/is_constant,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_constant,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_constant,Power-method.html b/docs/reference/is_constant,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/is_constant,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_constant.html b/docs/reference/is_constant.html new file mode 100644 index 00000000..53bfddbd --- /dev/null +++ b/docs/reference/is_constant.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_convex,Atom-method.html b/docs/reference/is_convex,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/is_convex,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_convex,Expression-method.html b/docs/reference/is_convex,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_convex,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_convex,Leaf-method.html b/docs/reference/is_convex,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_convex,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_convex.html b/docs/reference/is_convex.html new file mode 100644 index 00000000..53bfddbd --- /dev/null +++ b/docs/reference/is_convex.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,Constraint-method.html b/docs/reference/is_dcp,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/is_dcp,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,EqConstraint-method.html b/docs/reference/is_dcp,EqConstraint-method.html new file mode 100644 index 00000000..9ee425a1 --- /dev/null +++ b/docs/reference/is_dcp,EqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,ExpCone-method.html b/docs/reference/is_dcp,ExpCone-method.html new file mode 100644 index 00000000..ec35993c --- /dev/null +++ b/docs/reference/is_dcp,ExpCone-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,Expression-method.html b/docs/reference/is_dcp,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_dcp,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,IneqConstraint-method.html b/docs/reference/is_dcp,IneqConstraint-method.html new file mode 100644 index 00000000..d750b8f5 --- /dev/null +++ b/docs/reference/is_dcp,IneqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,Maximize-method.html b/docs/reference/is_dcp,Maximize-method.html new file mode 100644 index 00000000..24ee6b70 --- /dev/null +++ b/docs/reference/is_dcp,Maximize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,Minimize-method.html b/docs/reference/is_dcp,Minimize-method.html new file mode 100644 index 00000000..14d22bec --- /dev/null +++ b/docs/reference/is_dcp,Minimize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,NonPosConstraint-method.html b/docs/reference/is_dcp,NonPosConstraint-method.html new file mode 100644 index 00000000..687578bd --- /dev/null +++ b/docs/reference/is_dcp,NonPosConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,PSDConstraint-method.html b/docs/reference/is_dcp,PSDConstraint-method.html new file mode 100644 index 00000000..0f746d96 --- /dev/null +++ b/docs/reference/is_dcp,PSDConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,Problem-method.html b/docs/reference/is_dcp,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/is_dcp,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,SOC-method.html b/docs/reference/is_dcp,SOC-method.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/is_dcp,SOC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp,ZeroConstraint-method.html b/docs/reference/is_dcp,ZeroConstraint-method.html new file mode 100644 index 00000000..10615fe5 --- /dev/null +++ b/docs/reference/is_dcp,ZeroConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dcp.html b/docs/reference/is_dcp.html index ae55fc58..6523c2f1 100644 --- a/docs/reference/is_dcp.html +++ b/docs/reference/is_dcp.html @@ -1,9 +1,9 @@ -DCP Compliance — is_dcp • CVXRDCP Compliance — is_dcp • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

DCP Compliance

Arguments

-
object
+ + +
object

A Problem or Expression object.

Value

- - -

A logical value indicating whether the problem or expression is DCP compliant, i.e. no unknown curvatures.

+

A logical value indicating whether the problem or expression is DCP compliant, i.e. no unknown curvatures.

@@ -89,74 +89,10 @@

Examples

is_dcp(prob) #> [1] TRUE solve(prob) -#> $`2033` -#> [1] 5 -#> -#> $`2038` -#> [1] 10 -#> -#> $value -#> [1] 25 -#> -#> $status -#> [1] "optimal" -#> -#> $getValue -#> function (objet) -#> { -#> if (is(objet, "Variable") || is(objet, "Constraint")) -#> return(result[[as.character(id(objet))]]) -#> if (is_zero(objet)) { -#> dims <- dim(objet) -#> valResult <- matrix(0, nrow = dims[1], ncol = dims[2]) -#> } -#> else { -#> arg_values <- list() -#> idx <- 1 -#> for (arg in objet@args) { -#> arg_val <- if (is_constant(arg)) -#> value(arg) -#> else { -#> getValue(arg) -#> } -#> if (is.null(arg_val) || (any(is.na(arg_val)) && !is_constant(objet))) -#> return(NA) -#> else { -#> arg_values[[idx]] <- arg_val -#> idx <- idx + 1 -#> } -#> } -#> valResult <- to_numeric(objet, arg_values) -#> } -#> if (all(intf_dim(valResult) == c(1, 1))) -#> intf_scalar_value(valResult) -#> else valResult -#> } -#> <bytecode: 0x7f7a8cb6cdd0> -#> <environment: 0x7f7a9f8a7660> -#> -#> $getDualValue -#> function (objet) -#> { -#> if (!is(objet, "Constraint")) -#> stop("getDualValue: argument should be a Constraint!") -#> getValue(objet) -#> } -#> <bytecode: 0x7f7a8cb6e2a8> -#> <environment: 0x7f7a9f8a7660> -#> -#> $solver -#> [1] "OSQP" -#> -#> $solve_time -#> [1] 3.6776e-05 -#> -#> $setup_time -#> [1] NA -#> -#> $num_iters -#> [1] 50 -#> +#> Status: optimal +#> Objective value: 25.000000 +#> Solver: OSQP +#> → <me>$getValue(x) returns value of variable/constraint x
@@ -171,15 +107,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/is_decr,Abs-method.html b/docs/reference/is_decr,Abs-method.html new file mode 100644 index 00000000..6bc6fe74 --- /dev/null +++ b/docs/reference/is_decr,Abs-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,AffAtom-method.html b/docs/reference/is_decr,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_decr,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Atom-method.html b/docs/reference/is_decr,Atom-method.html new file mode 100644 index 00000000..135e1adf --- /dev/null +++ b/docs/reference/is_decr,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Conjugate-method.html b/docs/reference/is_decr,Conjugate-method.html new file mode 100644 index 00000000..2be5e9ec --- /dev/null +++ b/docs/reference/is_decr,Conjugate-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Conv-method.html b/docs/reference/is_decr,Conv-method.html new file mode 100644 index 00000000..dcfbf487 --- /dev/null +++ b/docs/reference/is_decr,Conv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,CumMax-method.html b/docs/reference/is_decr,CumMax-method.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/is_decr,CumMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,DivExpression-method.html b/docs/reference/is_decr,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/is_decr,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Entr-method.html b/docs/reference/is_decr,Entr-method.html new file mode 100644 index 00000000..2d645861 --- /dev/null +++ b/docs/reference/is_decr,Entr-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Exp-method.html b/docs/reference/is_decr,Exp-method.html new file mode 100644 index 00000000..ddba19b6 --- /dev/null +++ b/docs/reference/is_decr,Exp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,EyeMinusInv-method.html b/docs/reference/is_decr,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/is_decr,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,GeoMean-method.html b/docs/reference/is_decr,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/is_decr,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Huber-method.html b/docs/reference/is_decr,Huber-method.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/is_decr,Huber-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,KLDiv-method.html b/docs/reference/is_decr,KLDiv-method.html new file mode 100644 index 00000000..fa937a81 --- /dev/null +++ b/docs/reference/is_decr,KLDiv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Kron-method.html b/docs/reference/is_decr,Kron-method.html new file mode 100644 index 00000000..1b6e7ff6 --- /dev/null +++ b/docs/reference/is_decr,Kron-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,LambdaMax-method.html b/docs/reference/is_decr,LambdaMax-method.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/is_decr,LambdaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Log-method.html b/docs/reference/is_decr,Log-method.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/is_decr,Log-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,LogDet-method.html b/docs/reference/is_decr,LogDet-method.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/is_decr,LogDet-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,LogSumExp-method.html b/docs/reference/is_decr,LogSumExp-method.html new file mode 100644 index 00000000..994650e9 --- /dev/null +++ b/docs/reference/is_decr,LogSumExp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Logistic-method.html b/docs/reference/is_decr,Logistic-method.html new file mode 100644 index 00000000..cf33b8ec --- /dev/null +++ b/docs/reference/is_decr,Logistic-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,MatrixFrac-method.html b/docs/reference/is_decr,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/is_decr,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,MaxElemwise-method.html b/docs/reference/is_decr,MaxElemwise-method.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/is_decr,MaxElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,MaxEntries-method.html b/docs/reference/is_decr,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/is_decr,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,MinElemwise-method.html b/docs/reference/is_decr,MinElemwise-method.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/is_decr,MinElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,MinEntries-method.html b/docs/reference/is_decr,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/is_decr,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,MulExpression-method.html b/docs/reference/is_decr,MulExpression-method.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/is_decr,MulExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,NegExpression-method.html b/docs/reference/is_decr,NegExpression-method.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/is_decr,NegExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Norm1-method.html b/docs/reference/is_decr,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/is_decr,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,NormInf-method.html b/docs/reference/is_decr,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/is_decr,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,NormNuc-method.html b/docs/reference/is_decr,NormNuc-method.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/is_decr,NormNuc-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,OneMinusPos-method.html b/docs/reference/is_decr,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/is_decr,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,PfEigenvalue-method.html b/docs/reference/is_decr,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/is_decr,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Pnorm-method.html b/docs/reference/is_decr,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/is_decr,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,Power-method.html b/docs/reference/is_decr,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/is_decr,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,ProdEntries-method.html b/docs/reference/is_decr,ProdEntries-method.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/is_decr,ProdEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,QuadForm-method.html b/docs/reference/is_decr,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/is_decr,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,QuadOverLin-method.html b/docs/reference/is_decr,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/is_decr,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,SigmaMax-method.html b/docs/reference/is_decr,SigmaMax-method.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/is_decr,SigmaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,SumLargest-method.html b/docs/reference/is_decr,SumLargest-method.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/is_decr,SumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr,SymbolicQuadForm-method.html b/docs/reference/is_decr,SymbolicQuadForm-method.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/is_decr,SymbolicQuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_decr.html b/docs/reference/is_decr.html new file mode 100644 index 00000000..135e1adf --- /dev/null +++ b/docs/reference/is_decr.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,Constraint-method.html b/docs/reference/is_dgp,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/is_dgp,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,EqConstraint-method.html b/docs/reference/is_dgp,EqConstraint-method.html new file mode 100644 index 00000000..9ee425a1 --- /dev/null +++ b/docs/reference/is_dgp,EqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,ExpCone-method.html b/docs/reference/is_dgp,ExpCone-method.html new file mode 100644 index 00000000..ec35993c --- /dev/null +++ b/docs/reference/is_dgp,ExpCone-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,Expression-method.html b/docs/reference/is_dgp,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_dgp,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,IneqConstraint-method.html b/docs/reference/is_dgp,IneqConstraint-method.html new file mode 100644 index 00000000..d750b8f5 --- /dev/null +++ b/docs/reference/is_dgp,IneqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,Maximize-method.html b/docs/reference/is_dgp,Maximize-method.html new file mode 100644 index 00000000..24ee6b70 --- /dev/null +++ b/docs/reference/is_dgp,Maximize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,Minimize-method.html b/docs/reference/is_dgp,Minimize-method.html new file mode 100644 index 00000000..14d22bec --- /dev/null +++ b/docs/reference/is_dgp,Minimize-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,NonPosConstraint-method.html b/docs/reference/is_dgp,NonPosConstraint-method.html new file mode 100644 index 00000000..687578bd --- /dev/null +++ b/docs/reference/is_dgp,NonPosConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,PSDConstraint-method.html b/docs/reference/is_dgp,PSDConstraint-method.html new file mode 100644 index 00000000..0f746d96 --- /dev/null +++ b/docs/reference/is_dgp,PSDConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,Problem-method.html b/docs/reference/is_dgp,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/is_dgp,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,SOC-method.html b/docs/reference/is_dgp,SOC-method.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/is_dgp,SOC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp,ZeroConstraint-method.html b/docs/reference/is_dgp,ZeroConstraint-method.html new file mode 100644 index 00000000..10615fe5 --- /dev/null +++ b/docs/reference/is_dgp,ZeroConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_dgp.html b/docs/reference/is_dgp.html index ff2cfcc2..27f1f0d2 100644 --- a/docs/reference/is_dgp.html +++ b/docs/reference/is_dgp.html @@ -1,9 +1,9 @@ -DGP Compliance — is_dgp • CVXRDGP Compliance — is_dgp • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

DGP Compliance

Arguments

-
object
+ + +
object

A Problem or Expression object.

Value

- - -

A logical value indicating whether the problem or expression is DCP compliant, i.e. no unknown curvatures.

+

A logical value indicating whether the problem or expression is DCP compliant, i.e. no unknown curvatures.

@@ -90,80 +90,10 @@

Examples

is_dgp(prob) #> [1] TRUE solve(prob, gp = TRUE) -#> $`2064` -#> [1] 5 -#> -#> $`2065` -#> [1] 5 -#> -#> $`2070` -#> [1] 1 -#> -#> $`2076` -#> [1] 1 -#> -#> $value -#> [1] 25 -#> -#> $status -#> [1] "optimal" -#> -#> $getValue -#> function (objet) -#> { -#> if (is(objet, "Variable") || is(objet, "Constraint")) -#> return(result[[as.character(id(objet))]]) -#> if (is_zero(objet)) { -#> dims <- dim(objet) -#> valResult <- matrix(0, nrow = dims[1], ncol = dims[2]) -#> } -#> else { -#> arg_values <- list() -#> idx <- 1 -#> for (arg in objet@args) { -#> arg_val <- if (is_constant(arg)) -#> value(arg) -#> else { -#> getValue(arg) -#> } -#> if (is.null(arg_val) || (any(is.na(arg_val)) && !is_constant(objet))) -#> return(NA) -#> else { -#> arg_values[[idx]] <- arg_val -#> idx <- idx + 1 -#> } -#> } -#> valResult <- to_numeric(objet, arg_values) -#> } -#> if (all(intf_dim(valResult) == c(1, 1))) -#> intf_scalar_value(valResult) -#> else valResult -#> } -#> <bytecode: 0x7f7a8cb6cdd0> -#> <environment: 0x7f7acdd21f90> -#> -#> $getDualValue -#> function (objet) -#> { -#> if (!is(objet, "Constraint")) -#> stop("getDualValue: argument should be a Constraint!") -#> getValue(objet) -#> } -#> <bytecode: 0x7f7a8cb6e2a8> -#> <environment: 0x7f7acdd21f90> -#> -#> $solver -#> [1] "MOSEK" -#> -#> $solve_time -#> [1] 0.0001189709 -#> -#> $setup_time -#> [1] NA -#> -#> $num_iters -#> [1] NA -#> +#> Status: optimal +#> Objective value: 25.000000 +#> Solver: MOSEK +#> → <me>$getValue(x) returns value of variable/constraint x
@@ -178,15 +108,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/is_hermitian,AddExpression-method.html b/docs/reference/is_hermitian,AddExpression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/is_hermitian,AddExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_hermitian,Conjugate-method.html b/docs/reference/is_hermitian,Conjugate-method.html new file mode 100644 index 00000000..2be5e9ec --- /dev/null +++ b/docs/reference/is_hermitian,Conjugate-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_hermitian,Constant-method.html b/docs/reference/is_hermitian,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/is_hermitian,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_hermitian,DiagVec-method.html b/docs/reference/is_hermitian,DiagVec-method.html new file mode 100644 index 00000000..13c5eb42 --- /dev/null +++ b/docs/reference/is_hermitian,DiagVec-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_hermitian,Expression-method.html b/docs/reference/is_hermitian,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_hermitian,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_hermitian,Leaf-method.html b/docs/reference/is_hermitian,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_hermitian,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_hermitian,NegExpression-method.html b/docs/reference/is_hermitian,NegExpression-method.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/is_hermitian,NegExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_hermitian,Transpose-method.html b/docs/reference/is_hermitian,Transpose-method.html new file mode 100644 index 00000000..6d90f546 --- /dev/null +++ b/docs/reference/is_hermitian,Transpose-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_hermitian.html b/docs/reference/is_hermitian.html new file mode 100644 index 00000000..819c8741 --- /dev/null +++ b/docs/reference/is_hermitian.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_imag,AffAtom-method.html b/docs/reference/is_imag,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_imag,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_imag,Atom-method.html b/docs/reference/is_imag,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/is_imag,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_imag,BinaryOperator-method.html b/docs/reference/is_imag,BinaryOperator-method.html new file mode 100644 index 00000000..0ce00269 --- /dev/null +++ b/docs/reference/is_imag,BinaryOperator-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_imag,Constant-method.html b/docs/reference/is_imag,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/is_imag,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_imag,Constraint-method.html b/docs/reference/is_imag,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/is_imag,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_imag,Expression-method.html b/docs/reference/is_imag,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_imag,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_imag,Imag-method.html b/docs/reference/is_imag,Imag-method.html new file mode 100644 index 00000000..162e57af --- /dev/null +++ b/docs/reference/is_imag,Imag-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_imag,Leaf-method.html b/docs/reference/is_imag,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_imag,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_imag,Real-method.html b/docs/reference/is_imag,Real-method.html new file mode 100644 index 00000000..80f9cd35 --- /dev/null +++ b/docs/reference/is_imag,Real-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_imag.html b/docs/reference/is_imag.html new file mode 100644 index 00000000..f96cc8df --- /dev/null +++ b/docs/reference/is_imag.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Abs-method.html b/docs/reference/is_incr,Abs-method.html new file mode 100644 index 00000000..6bc6fe74 --- /dev/null +++ b/docs/reference/is_incr,Abs-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,AffAtom-method.html b/docs/reference/is_incr,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_incr,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Atom-method.html b/docs/reference/is_incr,Atom-method.html new file mode 100644 index 00000000..135e1adf --- /dev/null +++ b/docs/reference/is_incr,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Conjugate-method.html b/docs/reference/is_incr,Conjugate-method.html new file mode 100644 index 00000000..2be5e9ec --- /dev/null +++ b/docs/reference/is_incr,Conjugate-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Conv-method.html b/docs/reference/is_incr,Conv-method.html new file mode 100644 index 00000000..dcfbf487 --- /dev/null +++ b/docs/reference/is_incr,Conv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,CumMax-method.html b/docs/reference/is_incr,CumMax-method.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/is_incr,CumMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,DivExpression-method.html b/docs/reference/is_incr,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/is_incr,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Entr-method.html b/docs/reference/is_incr,Entr-method.html new file mode 100644 index 00000000..2d645861 --- /dev/null +++ b/docs/reference/is_incr,Entr-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Exp-method.html b/docs/reference/is_incr,Exp-method.html new file mode 100644 index 00000000..ddba19b6 --- /dev/null +++ b/docs/reference/is_incr,Exp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,EyeMinusInv-method.html b/docs/reference/is_incr,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/is_incr,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,GeoMean-method.html b/docs/reference/is_incr,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/is_incr,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Huber-method.html b/docs/reference/is_incr,Huber-method.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/is_incr,Huber-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,KLDiv-method.html b/docs/reference/is_incr,KLDiv-method.html new file mode 100644 index 00000000..fa937a81 --- /dev/null +++ b/docs/reference/is_incr,KLDiv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Kron-method.html b/docs/reference/is_incr,Kron-method.html new file mode 100644 index 00000000..1b6e7ff6 --- /dev/null +++ b/docs/reference/is_incr,Kron-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,LambdaMax-method.html b/docs/reference/is_incr,LambdaMax-method.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/is_incr,LambdaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Log-method.html b/docs/reference/is_incr,Log-method.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/is_incr,Log-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,LogDet-method.html b/docs/reference/is_incr,LogDet-method.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/is_incr,LogDet-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,LogSumExp-method.html b/docs/reference/is_incr,LogSumExp-method.html new file mode 100644 index 00000000..994650e9 --- /dev/null +++ b/docs/reference/is_incr,LogSumExp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Logistic-method.html b/docs/reference/is_incr,Logistic-method.html new file mode 100644 index 00000000..cf33b8ec --- /dev/null +++ b/docs/reference/is_incr,Logistic-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,MatrixFrac-method.html b/docs/reference/is_incr,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/is_incr,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,MaxElemwise-method.html b/docs/reference/is_incr,MaxElemwise-method.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/is_incr,MaxElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,MaxEntries-method.html b/docs/reference/is_incr,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/is_incr,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,MinElemwise-method.html b/docs/reference/is_incr,MinElemwise-method.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/is_incr,MinElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,MinEntries-method.html b/docs/reference/is_incr,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/is_incr,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,MulExpression-method.html b/docs/reference/is_incr,MulExpression-method.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/is_incr,MulExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,NegExpression-method.html b/docs/reference/is_incr,NegExpression-method.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/is_incr,NegExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Norm1-method.html b/docs/reference/is_incr,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/is_incr,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,NormInf-method.html b/docs/reference/is_incr,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/is_incr,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,NormNuc-method.html b/docs/reference/is_incr,NormNuc-method.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/is_incr,NormNuc-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,OneMinusPos-method.html b/docs/reference/is_incr,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/is_incr,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,PfEigenvalue-method.html b/docs/reference/is_incr,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/is_incr,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Pnorm-method.html b/docs/reference/is_incr,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/is_incr,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,Power-method.html b/docs/reference/is_incr,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/is_incr,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,ProdEntries-method.html b/docs/reference/is_incr,ProdEntries-method.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/is_incr,ProdEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,QuadForm-method.html b/docs/reference/is_incr,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/is_incr,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,QuadOverLin-method.html b/docs/reference/is_incr,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/is_incr,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,SigmaMax-method.html b/docs/reference/is_incr,SigmaMax-method.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/is_incr,SigmaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,SumLargest-method.html b/docs/reference/is_incr,SumLargest-method.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/is_incr,SumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr,SymbolicQuadForm-method.html b/docs/reference/is_incr,SymbolicQuadForm-method.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/is_incr,SymbolicQuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_incr.html b/docs/reference/is_incr.html new file mode 100644 index 00000000..135e1adf --- /dev/null +++ b/docs/reference/is_incr.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_installed,ConstantSolver-method.html b/docs/reference/is_installed,ConstantSolver-method.html new file mode 100644 index 00000000..563daa80 --- /dev/null +++ b/docs/reference/is_installed,ConstantSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_installed,ReductionSolver-method.html b/docs/reference/is_installed,ReductionSolver-method.html new file mode 100644 index 00000000..11a3d8b1 --- /dev/null +++ b/docs/reference/is_installed,ReductionSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_affine,Expression-method.html b/docs/reference/is_log_log_affine,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_log_log_affine,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_affine.html b/docs/reference/is_log_log_affine.html new file mode 100644 index 00000000..3e2af12e --- /dev/null +++ b/docs/reference/is_log_log_affine.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_concave,Atom-method.html b/docs/reference/is_log_log_concave,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/is_log_log_concave,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_concave,Expression-method.html b/docs/reference/is_log_log_concave,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_log_log_concave,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_concave,Leaf-method.html b/docs/reference/is_log_log_concave,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_log_log_concave,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_concave.html b/docs/reference/is_log_log_concave.html new file mode 100644 index 00000000..3e2af12e --- /dev/null +++ b/docs/reference/is_log_log_concave.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_constant,Expression-method.html b/docs/reference/is_log_log_constant,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_log_log_constant,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_constant.html b/docs/reference/is_log_log_constant.html new file mode 100644 index 00000000..3e2af12e --- /dev/null +++ b/docs/reference/is_log_log_constant.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_convex,Atom-method.html b/docs/reference/is_log_log_convex,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/is_log_log_convex,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_convex,Expression-method.html b/docs/reference/is_log_log_convex,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_log_log_convex,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_convex,Leaf-method.html b/docs/reference/is_log_log_convex,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_log_log_convex,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_log_log_convex.html b/docs/reference/is_log_log_convex.html new file mode 100644 index 00000000..3e2af12e --- /dev/null +++ b/docs/reference/is_log_log_convex.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_matrix,Expression-method.html b/docs/reference/is_matrix,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_matrix,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_matrix.html b/docs/reference/is_matrix.html new file mode 100644 index 00000000..57990ad2 --- /dev/null +++ b/docs/reference/is_matrix.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_mixed_integer,Problem-method.html b/docs/reference/is_mixed_integer,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/is_mixed_integer,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_mixed_integer.html b/docs/reference/is_mixed_integer.html index 2d58cf78..89414bf5 100644 --- a/docs/reference/is_mixed_integer.html +++ b/docs/reference/is_mixed_integer.html @@ -1,9 +1,9 @@ -Is Problem Mixed Integer? — is_mixed_integer • CVXRIs Problem Mixed Integer? — is_mixed_integer • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Is Problem Mixed Integer?

Arguments

-
object
+ + +
object

A Problem object.

Value

- - -

A logical value indicating whether the problem is a mixed-integer program

+

A logical value indicating whether the problem is a mixed-integer program

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/is_neg,Leaf-method.html b/docs/reference/is_neg,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_neg,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_neg.html b/docs/reference/is_neg.html new file mode 100644 index 00000000..fff3c07d --- /dev/null +++ b/docs/reference/is_neg.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nonneg,Atom-method.html b/docs/reference/is_nonneg,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/is_nonneg,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nonneg,Constant-method.html b/docs/reference/is_nonneg,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/is_nonneg,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nonneg,Expression-method.html b/docs/reference/is_nonneg,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_nonneg,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nonneg,Leaf-method.html b/docs/reference/is_nonneg,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_nonneg,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nonneg.html b/docs/reference/is_nonneg.html new file mode 100644 index 00000000..afa72383 --- /dev/null +++ b/docs/reference/is_nonneg.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nonpos,Atom-method.html b/docs/reference/is_nonpos,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/is_nonpos,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nonpos,Constant-method.html b/docs/reference/is_nonpos,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/is_nonpos,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nonpos,Expression-method.html b/docs/reference/is_nonpos,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_nonpos,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nonpos,Leaf-method.html b/docs/reference/is_nonpos,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_nonpos,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nonpos.html b/docs/reference/is_nonpos.html new file mode 100644 index 00000000..afa72383 --- /dev/null +++ b/docs/reference/is_nonpos.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nsd,AffAtom-method.html b/docs/reference/is_nsd,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_nsd,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nsd,Constant-method.html b/docs/reference/is_nsd,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/is_nsd,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nsd,Expression-method.html b/docs/reference/is_nsd,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_nsd,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nsd,Leaf-method.html b/docs/reference/is_nsd,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_nsd,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nsd,Multiply-method.html b/docs/reference/is_nsd,Multiply-method.html new file mode 100644 index 00000000..99f85b11 --- /dev/null +++ b/docs/reference/is_nsd,Multiply-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_nsd.html b/docs/reference/is_nsd.html new file mode 100644 index 00000000..819c8741 --- /dev/null +++ b/docs/reference/is_nsd.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pos,Constant-method.html b/docs/reference/is_pos,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/is_pos,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pos,Leaf-method.html b/docs/reference/is_pos,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_pos,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pos.html b/docs/reference/is_pos.html new file mode 100644 index 00000000..fff3c07d --- /dev/null +++ b/docs/reference/is_pos.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_psd,AffAtom-method.html b/docs/reference/is_psd,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_psd,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_psd,Constant-method.html b/docs/reference/is_psd,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/is_psd,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_psd,Expression-method.html b/docs/reference/is_psd,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_psd,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_psd,Leaf-method.html b/docs/reference/is_psd,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_psd,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_psd,Multiply-method.html b/docs/reference/is_psd,Multiply-method.html new file mode 100644 index 00000000..99f85b11 --- /dev/null +++ b/docs/reference/is_psd,Multiply-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_psd,PSDWrap-method.html b/docs/reference/is_psd,PSDWrap-method.html new file mode 100644 index 00000000..88230429 --- /dev/null +++ b/docs/reference/is_psd,PSDWrap-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_psd.html b/docs/reference/is_psd.html new file mode 100644 index 00000000..819c8741 --- /dev/null +++ b/docs/reference/is_psd.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,Abs-method.html b/docs/reference/is_pwl,Abs-method.html new file mode 100644 index 00000000..6bc6fe74 --- /dev/null +++ b/docs/reference/is_pwl,Abs-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,AffAtom-method.html b/docs/reference/is_pwl,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_pwl,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,Expression-method.html b/docs/reference/is_pwl,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_pwl,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,Leaf-method.html b/docs/reference/is_pwl,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_pwl,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,MaxElemwise-method.html b/docs/reference/is_pwl,MaxElemwise-method.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/is_pwl,MaxElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,MaxEntries-method.html b/docs/reference/is_pwl,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/is_pwl,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,MinElemwise-method.html b/docs/reference/is_pwl,MinElemwise-method.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/is_pwl,MinElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,MinEntries-method.html b/docs/reference/is_pwl,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/is_pwl,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,Norm1-method.html b/docs/reference/is_pwl,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/is_pwl,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,NormInf-method.html b/docs/reference/is_pwl,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/is_pwl,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,Pnorm-method.html b/docs/reference/is_pwl,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/is_pwl,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl,QuadForm-method.html b/docs/reference/is_pwl,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/is_pwl,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_pwl.html b/docs/reference/is_pwl.html new file mode 100644 index 00000000..53bfddbd --- /dev/null +++ b/docs/reference/is_pwl.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_qp,Problem-method.html b/docs/reference/is_qp,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/is_qp,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_qp.html b/docs/reference/is_qp.html index 86ff897b..3e53d46d 100644 --- a/docs/reference/is_qp.html +++ b/docs/reference/is_qp.html @@ -1,9 +1,9 @@ -Is Problem a QP? — is_qp • CVXRIs Problem a QP? — is_qp • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Is Problem a QP?

Arguments

-
object
+ + +
object

A Problem object.

Value

- - -

A logical value indicating whether the problem is a quadratic program.

+

A logical value indicating whether the problem is a quadratic program.

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/is_qpwa,AffAtom-method.html b/docs/reference/is_qpwa,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_qpwa,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_qpwa,DivExpression-method.html b/docs/reference/is_qpwa,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/is_qpwa,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_qpwa,Expression-method.html b/docs/reference/is_qpwa,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_qpwa,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_qpwa,MatrixFrac-method.html b/docs/reference/is_qpwa,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/is_qpwa,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_qpwa,Objective-method.html b/docs/reference/is_qpwa,Objective-method.html new file mode 100644 index 00000000..6c63d296 --- /dev/null +++ b/docs/reference/is_qpwa,Objective-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_qpwa,Power-method.html b/docs/reference/is_qpwa,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/is_qpwa,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_qpwa,QuadOverLin-method.html b/docs/reference/is_qpwa,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/is_qpwa,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_qpwa.html b/docs/reference/is_qpwa.html new file mode 100644 index 00000000..53bfddbd --- /dev/null +++ b/docs/reference/is_qpwa.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,AffAtom-method.html b/docs/reference/is_quadratic,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/is_quadratic,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,DivExpression-method.html b/docs/reference/is_quadratic,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/is_quadratic,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,Expression-method.html b/docs/reference/is_quadratic,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_quadratic,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,Huber-method.html b/docs/reference/is_quadratic,Huber-method.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/is_quadratic,Huber-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,Leaf-method.html b/docs/reference/is_quadratic,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_quadratic,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,MatrixFrac-method.html b/docs/reference/is_quadratic,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/is_quadratic,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,Objective-method.html b/docs/reference/is_quadratic,Objective-method.html new file mode 100644 index 00000000..6c63d296 --- /dev/null +++ b/docs/reference/is_quadratic,Objective-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,Power-method.html b/docs/reference/is_quadratic,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/is_quadratic,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,QuadForm-method.html b/docs/reference/is_quadratic,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/is_quadratic,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,QuadOverLin-method.html b/docs/reference/is_quadratic,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/is_quadratic,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic,SymbolicQuadForm-method.html b/docs/reference/is_quadratic,SymbolicQuadForm-method.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/is_quadratic,SymbolicQuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_quadratic.html b/docs/reference/is_quadratic.html new file mode 100644 index 00000000..53bfddbd --- /dev/null +++ b/docs/reference/is_quadratic.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_real,Constraint-method.html b/docs/reference/is_real,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/is_real,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_real,Expression-method.html b/docs/reference/is_real,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_real,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_real.html b/docs/reference/is_real.html new file mode 100644 index 00000000..f96cc8df --- /dev/null +++ b/docs/reference/is_real.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_scalar,Expression-method.html b/docs/reference/is_scalar,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_scalar,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_scalar.html b/docs/reference/is_scalar.html new file mode 100644 index 00000000..57990ad2 --- /dev/null +++ b/docs/reference/is_scalar.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_stuffed_cone_constraint.html b/docs/reference/is_stuffed_cone_constraint.html index d647e886..7322143d 100644 --- a/docs/reference/is_stuffed_cone_constraint.html +++ b/docs/reference/is_stuffed_cone_constraint.html @@ -1,9 +1,9 @@ -Is the constraint a stuffed cone constraint? — is_stuffed_cone_constraint • CVXRIs the constraint a stuffed cone constraint? — is_stuffed_cone_constraint • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Is the constraint a stuffed cone constraint?

Arguments

-
constraint
+ + +
constraint

A Constraint object.

Value

- - -

Is the constraint a stuffed-cone constraint?

+

Is the constraint a stuffed-cone constraint?

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/is_stuffed_cone_objective.html b/docs/reference/is_stuffed_cone_objective.html index d6d929b9..c5c2f69e 100644 --- a/docs/reference/is_stuffed_cone_objective.html +++ b/docs/reference/is_stuffed_cone_objective.html @@ -1,9 +1,9 @@ -Is the objective a stuffed cone objective? — is_stuffed_cone_objective • CVXRIs the objective a stuffed cone objective? — is_stuffed_cone_objective • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Is the objective a stuffed cone objective?

Arguments

-
objective
+ + +
objective

An Objective object.

Value

- - -

Is the objective a stuffed-cone objective?

+

Is the objective a stuffed-cone objective?

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/is_stuffed_qp_objective.html b/docs/reference/is_stuffed_qp_objective.html index 82060c85..4ef6c159 100644 --- a/docs/reference/is_stuffed_qp_objective.html +++ b/docs/reference/is_stuffed_qp_objective.html @@ -1,9 +1,9 @@ -Is the QP objective stuffed? — is_stuffed_qp_objective • CVXRIs the QP objective stuffed? — is_stuffed_qp_objective • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Is the QP objective stuffed?

Arguments

-
objective
+ + +
objective

A Minimize or Maximize object representing the optimization objective.

Value

- - -

Is the objective a stuffed QP?

+

Is the objective a stuffed QP?

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/is_symmetric,AddExpression-method.html b/docs/reference/is_symmetric,AddExpression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/is_symmetric,AddExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,Conjugate-method.html b/docs/reference/is_symmetric,Conjugate-method.html new file mode 100644 index 00000000..2be5e9ec --- /dev/null +++ b/docs/reference/is_symmetric,Conjugate-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,Constant-method.html b/docs/reference/is_symmetric,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/is_symmetric,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,DiagVec-method.html b/docs/reference/is_symmetric,DiagVec-method.html new file mode 100644 index 00000000..13c5eb42 --- /dev/null +++ b/docs/reference/is_symmetric,DiagVec-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,Elementwise-method.html b/docs/reference/is_symmetric,Elementwise-method.html new file mode 100644 index 00000000..aff69519 --- /dev/null +++ b/docs/reference/is_symmetric,Elementwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,Expression-method.html b/docs/reference/is_symmetric,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_symmetric,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,Imag-method.html b/docs/reference/is_symmetric,Imag-method.html new file mode 100644 index 00000000..162e57af --- /dev/null +++ b/docs/reference/is_symmetric,Imag-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,Leaf-method.html b/docs/reference/is_symmetric,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/is_symmetric,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,NegExpression-method.html b/docs/reference/is_symmetric,NegExpression-method.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/is_symmetric,NegExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,Promote-method.html b/docs/reference/is_symmetric,Promote-method.html new file mode 100644 index 00000000..3454ffa2 --- /dev/null +++ b/docs/reference/is_symmetric,Promote-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,Real-method.html b/docs/reference/is_symmetric,Real-method.html new file mode 100644 index 00000000..80f9cd35 --- /dev/null +++ b/docs/reference/is_symmetric,Real-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric,Transpose-method.html b/docs/reference/is_symmetric,Transpose-method.html new file mode 100644 index 00000000..6d90f546 --- /dev/null +++ b/docs/reference/is_symmetric,Transpose-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_symmetric.html b/docs/reference/is_symmetric.html new file mode 100644 index 00000000..819c8741 --- /dev/null +++ b/docs/reference/is_symmetric.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_vector,Expression-method.html b/docs/reference/is_vector,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_vector,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_vector.html b/docs/reference/is_vector.html new file mode 100644 index 00000000..57990ad2 --- /dev/null +++ b/docs/reference/is_vector.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_zero,Expression-method.html b/docs/reference/is_zero,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/is_zero,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/is_zero.html b/docs/reference/is_zero.html new file mode 100644 index 00000000..afa72383 --- /dev/null +++ b/docs/reference/is_zero.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/kl_div.html b/docs/reference/kl_div.html index a352afd8..16efb1d0 100644 --- a/docs/reference/kl_div.html +++ b/docs/reference/kl_div.html @@ -1,9 +1,9 @@ -Kullback-Leibler Divergence — kl_div • CVXRKullback-Leibler Divergence — kl_div • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Kullback-Leibler Divergence

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
y
+
y

An Expression, vector, or matrix.

Value

- - -

An Expression representing the KL-divergence of the input.

+

An Expression representing the KL-divergence of the input.

@@ -132,15 +132,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/kronecker,ANY,Expression-method.html b/docs/reference/kronecker,ANY,Expression-method.html new file mode 100644 index 00000000..4478187d --- /dev/null +++ b/docs/reference/kronecker,ANY,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/kronecker.html b/docs/reference/kronecker.html index 054f3882..12c33076 100644 --- a/docs/reference/kronecker.html +++ b/docs/reference/kronecker.html @@ -1,9 +1,9 @@ -Kronecker Product — kronecker,Expression,ANY-method • CVXRKronecker Product — kronecker,Expression,ANY-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,40 +66,40 @@

Kronecker Product

-
# S4 method for Expression,ANY
+    
# S4 method for class 'Expression,ANY'
 kronecker(X, Y, FUN = "*", make.dimnames = FALSE, ...)
 
-# S4 method for ANY,Expression
+# S4 method for class 'ANY,Expression'
 kronecker(X, Y, FUN = "*", make.dimnames = FALSE, ...)

Arguments

-
X
+ + +
X

An Expression or matrix.

-
Y
+
Y

An Expression or matrix.

-
FUN
+
FUN

Hardwired to "*" for the kronecker product.

-
make.dimnames
+
make.dimnames

(Unimplemented) Dimension names are not supported in Expression objects.

-
...
+
...

(Unimplemented) Optional arguments.

Value

- - -

An Expression that represents the kronecker product.

+

An Expression that represents the kronecker product.

@@ -133,15 +133,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/lambda_max.html b/docs/reference/lambda_max.html index a7e8fde5..0202feb7 100644 --- a/docs/reference/lambda_max.html +++ b/docs/reference/lambda_max.html @@ -1,9 +1,9 @@ -Maximum Eigenvalue — lambda_max • CVXRMaximum Eigenvalue — lambda_max • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Maximum Eigenvalue

Arguments

-
A
+ + +
A

An Expression or matrix.

Value

- - -

An Expression representing the maximum eigenvalue of the input.

+

An Expression representing the maximum eigenvalue of the input.

@@ -117,15 +117,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/lambda_min.html b/docs/reference/lambda_min.html index 6c573da7..5fb0b2b4 100644 --- a/docs/reference/lambda_min.html +++ b/docs/reference/lambda_min.html @@ -1,9 +1,9 @@ -Minimum Eigenvalue — lambda_min • CVXRMinimum Eigenvalue — lambda_min • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Minimum Eigenvalue

Arguments

-
A
+ + +
A

An Expression or matrix.

Value

- - -

An Expression representing the minimum eigenvalue of the input.

+

An Expression representing the minimum eigenvalue of the input.

@@ -108,15 +108,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/lambda_sum_largest.html b/docs/reference/lambda_sum_largest.html index c8a10024..6dc3c4e0 100644 --- a/docs/reference/lambda_sum_largest.html +++ b/docs/reference/lambda_sum_largest.html @@ -1,9 +1,9 @@ -Sum of Largest Eigenvalues — lambda_sum_largest • CVXRSum of Largest Eigenvalues — lambda_sum_largest • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Sum of Largest Eigenvalues

Arguments

-
A
+ + +
A

An Expression or matrix.

-
k
+
k

The number of eigenvalues to sum over.

Value

- - -

An Expression representing the sum of the largest k eigenvalues of the input.

+

An Expression representing the sum of the largest k eigenvalues of the input.

@@ -113,15 +113,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/lambda_sum_smallest.html b/docs/reference/lambda_sum_smallest.html index b951e892..913fa6f7 100644 --- a/docs/reference/lambda_sum_smallest.html +++ b/docs/reference/lambda_sum_smallest.html @@ -1,9 +1,9 @@ -Sum of Smallest Eigenvalues — lambda_sum_smallest • CVXRSum of Smallest Eigenvalues — lambda_sum_smallest • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Sum of Smallest Eigenvalues

Arguments

-
A
+ + +
A

An Expression or matrix.

-
k
+
k

The number of eigenvalues to sum over.

Value

- - -

An Expression representing the sum of the smallest k eigenvalues of the input.

+

An Expression representing the sum of the smallest k eigenvalues of the input.

@@ -113,15 +113,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/leaf-attr.html b/docs/reference/leaf-attr.html index 56c8f2cd..3d3c7ff5 100644 --- a/docs/reference/leaf-attr.html +++ b/docs/reference/leaf-attr.html @@ -1,9 +1,9 @@ -Attributes of an Expression Leaf — leaf-attr • CVXRAttributes of an Expression Leaf — leaf-attr • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -73,15 +73,15 @@

Attributes of an Expression Leaf

Arguments

-
object
+ + +
object

A Leaf object.

Value

- - -

A logical value.

+

A logical value.

@@ -96,15 +96,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/length,Rdict-method.html b/docs/reference/length,Rdict-method.html new file mode 100644 index 00000000..aa0a0d7c --- /dev/null +++ b/docs/reference/length,Rdict-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/linearize.html b/docs/reference/linearize.html index 9b5cbf10..b28a4469 100644 --- a/docs/reference/linearize.html +++ b/docs/reference/linearize.html @@ -1,10 +1,10 @@ Affine Approximation to an Expression — linearize • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -73,15 +73,15 @@

Affine Approximation to an Expression

Arguments

-
expr
+ + +
expr

An Expression to linearize.

Value

- - -

An affine expression or NA if cannot be linearized.

+

An affine expression or NA if cannot be linearized.

Details

@@ -103,15 +103,15 @@

Details

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/log.html b/docs/reference/log.html index 5041e274..ab3ead1c 100644 --- a/docs/reference/log.html +++ b/docs/reference/log.html @@ -1,170 +1,8 @@ - -Logarithms — log,Expression-method • CVXR - - -
-
- - - -
-
- - -
-

The elementwise logarithm. -log computes the logarithm, by default the natural logarithm, log10 computes the common (i.e., base 10) logarithm, and log2 computes the binary (i.e., base 2) logarithms. The general form log(x, base) computes logarithms with base base. -log1p computes elementwise the function \(\log(1+x)\).

-
- -
-
# S4 method for Expression
-log(x, base = base::exp(1))
-
-# S4 method for Expression
-log10(x)
-
-# S4 method for Expression
-log2(x)
-
-# S4 method for Expression
-log1p(x)
-
- -
-

Arguments

-
x
-

An Expression.

- - -
base
-

(Optional) A positive number that is the base with respect to which the logarithm is computed. Defaults to \(e\).

- -
-
-

Value

- - -

An Expression representing the exponentiated input.

-
- -
-

Examples

-
# Log in objective
-x <- Variable(2)
-obj <- Maximize(sum(log(x)))
-constr <- list(x <= matrix(c(1, exp(1))))
-prob <- Problem(obj, constr)
-result <- solve(prob)
-result$value
-#> [1] 1
-result$getValue(x)
-#>          [,1]
-#> [1,] 1.000000
-#> [2,] 2.718282
-
-# Log in constraint
-obj <- Minimize(sum(x))
-constr <- list(log2(x) >= 0, x <= matrix(c(1,1)))
-prob <- Problem(obj, constr)
-result <- solve(prob)
-result$value
-#> [1] 2
-result$getValue(x)
-#>      [,1]
-#> [1,]    1
-#> [2,]    1
-
-# Index into log
-obj <- Maximize(log10(x)[2])
-constr <- list(x <= matrix(c(1, exp(1))))
-prob <- Problem(obj, constr)
-result <- solve(prob)
-result$value
-#> [1] 0.4342945
-
-# Scalar log
-obj <- Maximize(log1p(x[2]))
-constr <- list(x <= matrix(c(1, exp(1))))
-prob <- Problem(obj, constr)
-result <- solve(prob)
-result$value
-#> [1] 1.313262
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/log10,Expression-method.html b/docs/reference/log10,Expression-method.html new file mode 100644 index 00000000..837e42b8 --- /dev/null +++ b/docs/reference/log10,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/log10.html b/docs/reference/log10.html new file mode 100644 index 00000000..837e42b8 --- /dev/null +++ b/docs/reference/log10.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/log1p,Expression-method.html b/docs/reference/log1p,Expression-method.html new file mode 100644 index 00000000..837e42b8 --- /dev/null +++ b/docs/reference/log1p,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/log1p.html b/docs/reference/log1p.html new file mode 100644 index 00000000..5ff748f6 --- /dev/null +++ b/docs/reference/log1p.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/log2,Expression-method.html b/docs/reference/log2,Expression-method.html new file mode 100644 index 00000000..837e42b8 --- /dev/null +++ b/docs/reference/log2,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/log2.html b/docs/reference/log2.html new file mode 100644 index 00000000..837e42b8 --- /dev/null +++ b/docs/reference/log2.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/log_det.html b/docs/reference/log_det.html index 3d9adc40..a76bd500 100644 --- a/docs/reference/log_det.html +++ b/docs/reference/log_det.html @@ -1,9 +1,9 @@ -Log-Determinant — log_det • CVXRLog-Determinant — log_det • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Log-Determinant

Arguments

-
A
+ + +
A

An Expression or matrix.

Value

- - -

An Expression representing the log-determinant of the input.

+

An Expression representing the log-determinant of the input.

@@ -111,15 +111,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/log_log_curvature,Expression-method.html b/docs/reference/log_log_curvature,Expression-method.html new file mode 100644 index 00000000..75cffd5f --- /dev/null +++ b/docs/reference/log_log_curvature,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/log_log_curvature-atom.html b/docs/reference/log_log_curvature-atom.html index 410e6362..9e0c0b61 100644 --- a/docs/reference/log_log_curvature-atom.html +++ b/docs/reference/log_log_curvature-atom.html @@ -1,9 +1,9 @@ -Log-Log Curvature of an Atom — log_log_curvature-atom • CVXRLog-Log Curvature of an Atom — log_log_curvature-atom • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -75,15 +75,15 @@

Log-Log Curvature of an Atom

Arguments

-
object
+ + +
object

A Atom object.

Value

- - -

A logical value.

+

A logical value.

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/log_log_curvature-methods.html b/docs/reference/log_log_curvature-methods.html index fa6d1b9c..259af9b8 100644 --- a/docs/reference/log_log_curvature-methods.html +++ b/docs/reference/log_log_curvature-methods.html @@ -1,9 +1,9 @@ -Log-Log Curvature Properties — log_log_curvature-methods • CVXRLog-Log Curvature Properties — log_log_curvature-methods • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -77,15 +77,15 @@

Log-Log Curvature Properties

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A logical value.

+

A logical value.

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/log_log_curvature.html b/docs/reference/log_log_curvature.html index 6f278b97..b74c0d5c 100644 --- a/docs/reference/log_log_curvature.html +++ b/docs/reference/log_log_curvature.html @@ -1,10 +1,10 @@ Log-Log Curvature of Expression — log_log_curvature • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -70,23 +70,21 @@

Log-Log Curvature of Expression

log_log_curvature(object)
 
-# S4 method for Expression
+# S4 method for class 'Expression'
 log_log_curvature(object)

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A string indicating the log-log curvature of the expression, either "LOG_LOG_CONSTANT", "LOG_LOG_AFFINE", "LOG_LOG_CONVEX, "LOG_LOG_CONCAVE", or "UNKNOWN".

- - +

A string indicating the log-log curvature of the expression, either "LOG_LOG_CONSTANT", "LOG_LOG_AFFINE", "LOG_LOG_CONVEX, "LOG_LOG_CONCAVE", or "UNKNOWN".

A string indicating the log-log curvature of the expression, either "LOG_LOG_CONSTANT", "LOG_LOG_AFFINE", "LOG_LOG_CONVEX", "LOG_LOG_CONCAVE", or "UNKNOWN".

@@ -102,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/log_sum_exp.html b/docs/reference/log_sum_exp.html index de941796..9aea1fc6 100644 --- a/docs/reference/log_sum_exp.html +++ b/docs/reference/log_sum_exp.html @@ -1,9 +1,9 @@ -Log-Sum-Exponential — log_sum_exp • CVXRLog-Sum-Exponential — log_sum_exp • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Log-Sum-Exponential

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

Value

- - -

An Expression representing the log-sum-exponential of the input.

+

An Expression representing the log-sum-exponential of the input.

@@ -114,15 +114,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/logistic.html b/docs/reference/logistic.html index ec2f2b73..cf33b8ec 100644 --- a/docs/reference/logistic.html +++ b/docs/reference/logistic.html @@ -1,1136 +1,8 @@ - -Logistic Function — logistic • CVXR - - -
-
- - - -
-
- - -
-

The elementwise logistic function, \(\log(1 + e^x)\). -This is a special case of log(sum(exp)) that evaluates to a vector rather than to a scalar, which is useful for logistic regression.

-
- -
-
logistic(x)
-
- -
-

Arguments

-
x
-

An Expression, vector, or matrix.

- -
-
-

Value

- - -

An Expression representing the logistic function evaluated at the input.

-
- -
-

Examples

-
set.seed(92)
-n <- 20
-m <- 1000
-sigma <- 45
-
-beta_true <- stats::rnorm(n)
-idxs <- sample(n, size = 0.8*n, replace = FALSE)
-beta_true[idxs] <- 0
-X <- matrix(stats::rnorm(m*n, 0, 5), nrow = m, ncol = n)
-y <- sign(X %*% beta_true + stats::rnorm(m, 0, sigma))
-
-beta <- Variable(n)
-X_sign <- apply(X, 2, function(x) { ifelse(y <= 0, -1, 1) * x })
-obj <- -sum(logistic(-X[y <= 0,] %*% beta)) - sum(logistic(X[y == 1,] %*% beta))
-prob <- Problem(Maximize(obj))
-result <- solve(prob)
-
-log_odds <- result$getValue(X %*% beta)
-beta_res <- result$getValue(beta)
-y_probs <- 1/(1 + exp(-X %*% beta_res))
-log(y_probs/(1 - y_probs))
-#>                  [,1]
-#>    [1,] -0.6704566601
-#>    [2,] -0.5925155914
-#>    [3,] -0.2870297658
-#>    [4,] -0.3903425916
-#>    [5,]  0.1512533989
-#>    [6,] -0.3212308442
-#>    [7,]  0.0710815720
-#>    [8,] -0.0005972517
-#>    [9,]  0.6231543856
-#>   [10,] -0.3461542128
-#>   [11,]  0.6165907888
-#>   [12,]  0.2493802797
-#>   [13,] -0.4229470194
-#>   [14,]  1.3550590126
-#>   [15,] -0.3265597137
-#>   [16,] -0.5974060590
-#>   [17,]  1.4250937991
-#>   [18,] -0.8064117254
-#>   [19,]  0.6354245008
-#>   [20,] -0.5313297468
-#>   [21,] -0.5836826542
-#>   [22,] -0.2018604692
-#>   [23,] -1.5741079507
-#>   [24,] -0.2996817503
-#>   [25,] -0.2075326459
-#>   [26,]  0.4436962967
-#>   [27,] -0.5653426412
-#>   [28,] -1.2550595374
-#>   [29,] -0.5346239907
-#>   [30,]  0.4834049559
-#>   [31,]  0.2311018280
-#>   [32,]  0.2894463877
-#>   [33,] -0.0125268284
-#>   [34,]  0.7295741839
-#>   [35,] -0.8747089801
-#>   [36,] -0.3928902742
-#>   [37,] -0.1155668459
-#>   [38,]  1.1672435760
-#>   [39,] -0.7217417178
-#>   [40,]  0.0611243125
-#>   [41,] -0.6167645485
-#>   [42,] -0.0245103839
-#>   [43,]  0.6908204543
-#>   [44,] -0.8034455356
-#>   [45,]  0.8837094798
-#>   [46,] -1.0940587657
-#>   [47,]  0.0151093307
-#>   [48,] -0.0365091373
-#>   [49,]  0.1208098298
-#>   [50,]  0.0228335289
-#>   [51,]  0.0203841255
-#>   [52,] -0.4370865446
-#>   [53,]  0.0381300050
-#>   [54,] -0.0670260414
-#>   [55,] -0.5450479974
-#>   [56,] -0.1197495178
-#>   [57,] -0.1350421079
-#>   [58,]  0.1775461764
-#>   [59,]  1.1397934859
-#>   [60,] -0.4142561404
-#>   [61,]  0.3992984051
-#>   [62,] -0.4202125247
-#>   [63,]  0.0406907572
-#>   [64,] -0.6489089858
-#>   [65,] -0.9702903642
-#>   [66,]  0.1117445633
-#>   [67,] -0.1453568149
-#>   [68,]  0.0616516205
-#>   [69,]  0.0779096420
-#>   [70,]  0.4237417182
-#>   [71,] -0.4578309643
-#>   [72,] -0.2049702780
-#>   [73,] -0.2303885529
-#>   [74,]  0.1166963282
-#>   [75,] -0.3651955569
-#>   [76,] -0.2369500750
-#>   [77,]  0.1457228397
-#>   [78,] -1.0896406573
-#>   [79,] -0.1308710754
-#>   [80,]  0.2291674619
-#>   [81,]  0.1373238859
-#>   [82,] -0.0015643758
-#>   [83,]  0.3467565323
-#>   [84,] -0.1543888962
-#>   [85,] -0.2309014974
-#>   [86,] -0.5247106391
-#>   [87,]  0.4603747857
-#>   [88,] -0.3126465765
-#>   [89,]  0.2120047116
-#>   [90,]  0.3146963593
-#>   [91,]  0.4193015146
-#>   [92,]  0.6556778133
-#>   [93,] -0.5111104188
-#>   [94,]  1.3013236680
-#>   [95,]  0.8030124821
-#>   [96,]  0.2830361899
-#>   [97,] -0.6703954799
-#>   [98,]  0.6392057972
-#>   [99,]  0.0848836974
-#>  [100,] -0.0064337716
-#>  [101,]  0.1647458661
-#>  [102,]  0.2973106680
-#>  [103,]  0.3564182328
-#>  [104,] -0.8130441051
-#>  [105,] -0.5596560141
-#>  [106,]  0.2440618391
-#>  [107,] -0.5330512912
-#>  [108,]  0.4528402173
-#>  [109,] -0.5708931835
-#>  [110,] -0.4623969739
-#>  [111,] -0.2336890208
-#>  [112,]  0.1511207911
-#>  [113,] -0.0618991731
-#>  [114,]  0.5838949464
-#>  [115,] -0.0005892470
-#>  [116,] -0.7089720216
-#>  [117,] -0.3172697223
-#>  [118,]  0.3970567787
-#>  [119,] -1.5819880428
-#>  [120,]  0.5686251944
-#>  [121,] -0.3273432678
-#>  [122,] -0.8145940559
-#>  [123,] -0.0947979896
-#>  [124,]  0.3203428780
-#>  [125,] -0.4429133655
-#>  [126,]  0.1170332022
-#>  [127,] -0.7652234333
-#>  [128,] -0.0573318811
-#>  [129,]  0.0095928844
-#>  [130,] -0.1932131076
-#>  [131,]  0.1964228615
-#>  [132,] -0.3175599181
-#>  [133,]  0.4246197779
-#>  [134,]  0.1266881215
-#>  [135,]  0.3305602671
-#>  [136,] -0.0061834939
-#>  [137,] -0.5537621931
-#>  [138,] -0.1133697510
-#>  [139,] -0.7994572391
-#>  [140,]  0.8081578245
-#>  [141,]  0.4153083028
-#>  [142,]  0.8942222160
-#>  [143,] -0.3139444517
-#>  [144,]  0.1458380321
-#>  [145,] -0.2050259510
-#>  [146,] -0.0601892036
-#>  [147,] -1.1748051406
-#>  [148,]  0.5454688323
-#>  [149,]  0.2075669928
-#>  [150,] -0.2618746549
-#>  [151,]  0.8038868939
-#>  [152,] -0.0455069481
-#>  [153,]  0.5741311897
-#>  [154,]  0.6919848048
-#>  [155,]  0.0716646406
-#>  [156,] -0.4965733924
-#>  [157,]  0.4423892111
-#>  [158,] -0.3816839141
-#>  [159,]  0.5205994919
-#>  [160,] -0.1021932394
-#>  [161,] -0.2226407248
-#>  [162,]  0.7098824842
-#>  [163,]  0.5765239949
-#>  [164,]  0.2450293204
-#>  [165,] -0.1737074723
-#>  [166,]  0.3589634540
-#>  [167,] -0.3290028521
-#>  [168,] -0.8993322171
-#>  [169,] -0.8217942301
-#>  [170,] -0.7797747655
-#>  [171,] -0.2137166776
-#>  [172,]  0.5276279942
-#>  [173,] -0.8487795398
-#>  [174,]  0.1034542895
-#>  [175,] -0.4103611024
-#>  [176,] -0.7528761525
-#>  [177,] -0.4402384001
-#>  [178,] -1.0685618040
-#>  [179,]  0.4078520134
-#>  [180,]  0.6313571340
-#>  [181,]  0.3750879398
-#>  [182,] -0.0151754002
-#>  [183,] -0.5310802005
-#>  [184,]  0.4077498342
-#>  [185,]  0.1571536758
-#>  [186,] -0.6328579544
-#>  [187,] -0.3822521507
-#>  [188,]  0.5205127750
-#>  [189,]  0.2562676001
-#>  [190,]  0.8532572121
-#>  [191,] -0.5649117264
-#>  [192,]  0.0370585167
-#>  [193,] -0.3390790595
-#>  [194,] -0.0375169486
-#>  [195,]  0.0474707447
-#>  [196,] -0.0326514547
-#>  [197,]  0.2159972774
-#>  [198,] -1.0662461286
-#>  [199,] -0.9549865987
-#>  [200,] -0.6453789741
-#>  [201,]  0.5183307748
-#>  [202,] -0.6994981183
-#>  [203,]  0.2180974130
-#>  [204,]  0.1893054841
-#>  [205,]  0.4929863051
-#>  [206,]  0.1844648176
-#>  [207,]  0.3573890378
-#>  [208,] -0.2500557609
-#>  [209,]  1.3917106836
-#>  [210,] -0.7617778892
-#>  [211,]  0.5279206489
-#>  [212,] -1.0117658159
-#>  [213,] -0.2423709809
-#>  [214,] -0.6133908459
-#>  [215,] -1.1656157013
-#>  [216,]  0.3821323274
-#>  [217,] -0.4501177815
-#>  [218,] -1.0973275111
-#>  [219,]  0.8937308100
-#>  [220,]  0.3140650093
-#>  [221,]  0.1340498249
-#>  [222,] -1.2230817731
-#>  [223,]  0.5678172666
-#>  [224,]  0.8463547383
-#>  [225,]  0.6349126119
-#>  [226,]  0.7005876882
-#>  [227,] -0.7992087463
-#>  [228,]  0.5683384775
-#>  [229,]  0.4112971973
-#>  [230,]  0.0902409614
-#>  [231,] -0.3665163870
-#>  [232,]  0.0127784696
-#>  [233,]  0.1629153570
-#>  [234,] -0.3527155111
-#>  [235,] -0.0758198135
-#>  [236,]  0.0091712200
-#>  [237,] -0.4611139986
-#>  [238,]  0.0657035000
-#>  [239,] -0.5298528191
-#>  [240,] -0.5962161970
-#>  [241,]  0.0637669046
-#>  [242,] -0.3510112099
-#>  [243,]  0.5476027637
-#>  [244,]  0.5265563483
-#>  [245,] -0.8598107283
-#>  [246,]  0.6395255501
-#>  [247,]  0.3215942360
-#>  [248,] -0.4795886634
-#>  [249,]  0.3975190764
-#>  [250,]  0.1215631023
-#>  [251,] -0.3140252989
-#>  [252,] -0.3046458001
-#>  [253,]  0.3923162069
-#>  [254,] -0.1856423411
-#>  [255,] -0.0851603773
-#>  [256,] -0.0029482127
-#>  [257,]  0.5734735381
-#>  [258,] -0.0359977194
-#>  [259,] -0.9567905661
-#>  [260,]  0.6395616014
-#>  [261,]  0.4795687762
-#>  [262,]  0.1872599648
-#>  [263,] -0.2498881709
-#>  [264,]  0.3260938617
-#>  [265,]  0.1986580454
-#>  [266,] -0.6790600913
-#>  [267,]  0.6809504849
-#>  [268,] -0.2952543618
-#>  [269,]  0.5265755493
-#>  [270,]  0.6812868456
-#>  [271,] -0.4787183436
-#>  [272,]  0.6944639345
-#>  [273,]  0.3116161602
-#>  [274,]  0.6770352241
-#>  [275,]  0.0024198961
-#>  [276,]  0.1779762817
-#>  [277,]  0.1332637066
-#>  [278,]  0.2881592259
-#>  [279,] -0.8398208677
-#>  [280,]  0.8293027203
-#>  [281,]  0.3237905695
-#>  [282,]  0.3688696112
-#>  [283,] -0.2838397598
-#>  [284,]  0.1698065742
-#>  [285,] -0.0972781640
-#>  [286,]  0.1692293332
-#>  [287,]  0.6139295310
-#>  [288,]  0.1736829439
-#>  [289,] -0.0806338472
-#>  [290,]  0.0115350265
-#>  [291,] -0.3183864173
-#>  [292,]  0.0866710268
-#>  [293,] -0.7586296972
-#>  [294,]  0.0584507549
-#>  [295,] -0.1537362781
-#>  [296,]  0.8435282624
-#>  [297,]  0.8815392891
-#>  [298,]  0.1534469763
-#>  [299,]  1.2271212600
-#>  [300,]  0.3098916000
-#>  [301,] -0.2555255745
-#>  [302,] -0.2073281110
-#>  [303,] -0.2298554674
-#>  [304,] -0.5772110245
-#>  [305,] -0.4885371748
-#>  [306,]  0.5318245990
-#>  [307,] -0.1440915396
-#>  [308,]  0.6375851656
-#>  [309,]  0.2563565473
-#>  [310,] -0.0603848083
-#>  [311,] -0.2223194676
-#>  [312,] -0.4951070092
-#>  [313,] -0.2533144391
-#>  [314,]  0.3508803854
-#>  [315,]  0.0868143920
-#>  [316,] -0.3995760620
-#>  [317,] -0.2455234345
-#>  [318,] -0.0988023306
-#>  [319,]  0.6998229047
-#>  [320,] -0.4848186944
-#>  [321,] -0.3735362873
-#>  [322,] -0.0385919797
-#>  [323,]  0.0463459559
-#>  [324,] -0.8583646944
-#>  [325,] -0.4583177299
-#>  [326,]  0.6281397044
-#>  [327,] -0.6350930132
-#>  [328,] -0.9581823784
-#>  [329,]  0.9368446576
-#>  [330,]  0.1483849866
-#>  [331,] -0.0538264807
-#>  [332,] -1.2323011986
-#>  [333,] -0.1706885164
-#>  [334,]  0.1205507360
-#>  [335,] -0.4870842705
-#>  [336,]  0.0540006968
-#>  [337,] -0.1344842486
-#>  [338,]  1.1543564231
-#>  [339,]  0.8618954880
-#>  [340,]  0.0228928269
-#>  [341,] -0.5239006990
-#>  [342,]  0.3351221664
-#>  [343,] -0.7517139168
-#>  [344,]  0.6050284431
-#>  [345,] -0.0211552810
-#>  [346,]  0.4027175331
-#>  [347,]  0.8252852085
-#>  [348,] -0.3307087458
-#>  [349,]  0.3177258224
-#>  [350,] -0.0224526341
-#>  [351,] -0.5546741854
-#>  [352,] -0.2831584120
-#>  [353,] -0.1794649773
-#>  [354,] -0.5933507121
-#>  [355,]  0.5243789964
-#>  [356,]  0.2004109640
-#>  [357,]  0.2904665363
-#>  [358,] -0.4817097810
-#>  [359,] -0.1010052942
-#>  [360,]  0.3605534751
-#>  [361,]  0.3838585972
-#>  [362,] -0.6909236928
-#>  [363,] -0.3578673016
-#>  [364,]  0.7571636427
-#>  [365,]  0.4263330459
-#>  [366,] -0.7291975361
-#>  [367,]  1.3051018150
-#>  [368,]  0.3406674952
-#>  [369,]  0.1624612727
-#>  [370,] -0.4134237907
-#>  [371,]  0.8469756334
-#>  [372,]  0.1445681797
-#>  [373,] -1.0051098115
-#>  [374,]  0.1813248620
-#>  [375,]  0.3127957905
-#>  [376,] -0.2938446482
-#>  [377,] -1.1220696942
-#>  [378,]  0.0153639539
-#>  [379,]  0.6470270083
-#>  [380,] -1.1136243303
-#>  [381,] -0.6871705750
-#>  [382,]  0.5673074646
-#>  [383,] -0.2756604522
-#>  [384,] -0.8618049910
-#>  [385,] -0.1516823240
-#>  [386,] -0.2098201412
-#>  [387,] -1.2010298142
-#>  [388,]  1.2558427314
-#>  [389,] -0.5078108344
-#>  [390,] -0.8335823356
-#>  [391,]  0.8759229459
-#>  [392,]  0.5860428533
-#>  [393,] -1.2937980410
-#>  [394,] -0.7939846252
-#>  [395,] -0.5236335284
-#>  [396,]  0.1775975846
-#>  [397,] -1.4013400929
-#>  [398,]  0.7131508152
-#>  [399,]  0.0354491390
-#>  [400,]  0.1344366250
-#>  [401,]  0.4879745284
-#>  [402,]  0.3638074820
-#>  [403,] -0.1982415573
-#>  [404,]  0.1427058308
-#>  [405,]  0.0306148385
-#>  [406,]  0.6818142230
-#>  [407,]  0.0828439412
-#>  [408,]  0.1285023444
-#>  [409,]  0.7544467283
-#>  [410,]  0.2249889766
-#>  [411,]  0.0320368984
-#>  [412,]  0.4893712975
-#>  [413,]  0.3546914975
-#>  [414,] -0.3652916745
-#>  [415,]  0.8342618286
-#>  [416,] -0.2503049305
-#>  [417,]  0.5247218764
-#>  [418,]  0.9033035542
-#>  [419,]  0.6160200872
-#>  [420,]  0.1392514959
-#>  [421,]  0.7268226327
-#>  [422,] -0.5110357658
-#>  [423,] -0.6768711729
-#>  [424,]  0.8344246950
-#>  [425,]  0.3100200429
-#>  [426,]  0.4325878598
-#>  [427,]  0.1333008872
-#>  [428,]  0.5181933545
-#>  [429,] -0.3190005722
-#>  [430,]  0.4315606205
-#>  [431,]  0.3930258753
-#>  [432,] -0.4950415623
-#>  [433,] -0.7391246227
-#>  [434,] -0.3018831186
-#>  [435,] -0.2371877521
-#>  [436,]  0.9647911369
-#>  [437,] -0.5663594260
-#>  [438,] -0.2494167440
-#>  [439,] -0.8171821433
-#>  [440,] -0.7060567490
-#>  [441,] -0.5057583678
-#>  [442,]  0.3789756520
-#>  [443,] -0.9727593552
-#>  [444,]  0.4803698804
-#>  [445,]  0.6154932259
-#>  [446,] -0.2193750953
-#>  [447,]  0.2770446970
-#>  [448,]  0.1446123066
-#>  [449,]  0.7294647899
-#>  [450,]  0.1318375506
-#>  [451,] -0.9285885489
-#>  [452,]  0.5649870685
-#>  [453,] -0.0734971335
-#>  [454,]  0.6055726790
-#>  [455,]  0.5110901373
-#>  [456,]  0.3522389149
-#>  [457,] -0.7569925274
-#>  [458,] -0.1832521125
-#>  [459,] -0.7545274294
-#>  [460,] -0.0289834723
-#>  [461,]  0.7738049808
-#>  [462,]  0.4915963396
-#>  [463,] -0.3123273178
-#>  [464,] -1.0281669120
-#>  [465,]  0.2270999811
-#>  [466,]  0.7107782565
-#>  [467,] -0.3046705517
-#>  [468,] -0.5839071481
-#>  [469,]  1.4979018365
-#>  [470,] -0.2798531408
-#>  [471,]  0.0598986526
-#>  [472,] -0.1166454607
-#>  [473,]  0.5759189086
-#>  [474,]  0.0739414249
-#>  [475,]  0.5817785017
-#>  [476,]  0.2869966634
-#>  [477,] -0.1296562333
-#>  [478,]  0.4669492271
-#>  [479,] -0.0833634990
-#>  [480,]  0.0444096705
-#>  [481,] -0.2424477777
-#>  [482,]  0.4827976350
-#>  [483,]  0.3103920469
-#>  [484,]  0.0108840206
-#>  [485,]  0.7864389056
-#>  [486,] -0.9775841591
-#>  [487,] -0.3104754891
-#>  [488,] -0.3305425914
-#>  [489,] -0.2215509763
-#>  [490,]  0.0721143735
-#>  [491,]  0.2177853569
-#>  [492,]  0.1394636725
-#>  [493,]  0.2520085800
-#>  [494,]  0.5967270610
-#>  [495,]  0.3058376600
-#>  [496,]  0.5917353513
-#>  [497,]  0.3640662733
-#>  [498,]  0.1549089403
-#>  [499,] -0.4251336377
-#>  [500,] -0.5954614705
-#>  [501,]  0.1971901463
-#>  [502,]  0.3262361037
-#>  [503,]  0.2089600274
-#>  [504,] -0.3834680497
-#>  [505,]  0.4277940938
-#>  [506,]  0.0551671256
-#>  [507,] -0.0386640086
-#>  [508,]  0.2733780431
-#>  [509,] -0.5726047975
-#>  [510,] -0.2647283714
-#>  [511,] -0.1636688193
-#>  [512,]  0.2262534070
-#>  [513,] -0.0280563189
-#>  [514,] -0.2338544077
-#>  [515,]  0.6861872381
-#>  [516,] -0.5119125214
-#>  [517,] -0.0523609926
-#>  [518,]  0.1044164641
-#>  [519,] -0.1237390590
-#>  [520,]  0.0757027240
-#>  [521,] -0.5462324268
-#>  [522,]  0.0475500898
-#>  [523,]  1.1280721475
-#>  [524,]  2.1538521816
-#>  [525,] -0.3064773536
-#>  [526,] -0.0496098560
-#>  [527,] -0.8555980974
-#>  [528,]  0.0941731448
-#>  [529,] -0.2142726218
-#>  [530,]  0.4862901334
-#>  [531,] -0.6682417761
-#>  [532,] -0.1670060019
-#>  [533,]  0.5639675660
-#>  [534,]  0.0179407790
-#>  [535,] -0.3645781902
-#>  [536,]  0.0408228260
-#>  [537,]  0.9396738163
-#>  [538,] -0.1184797861
-#>  [539,]  0.4494313329
-#>  [540,] -0.2161908811
-#>  [541,] -0.0674621273
-#>  [542,]  0.2276748621
-#>  [543,]  0.1874745461
-#>  [544,] -0.2695337123
-#>  [545,] -0.1355847719
-#>  [546,]  0.8939394488
-#>  [547,] -0.3868942722
-#>  [548,]  0.0633859755
-#>  [549,]  0.4120442669
-#>  [550,]  0.2301485812
-#>  [551,]  0.9149448647
-#>  [552,]  1.1397572405
-#>  [553,] -0.4759021874
-#>  [554,] -0.2316796589
-#>  [555,]  0.5579682640
-#>  [556,] -0.4722367623
-#>  [557,] -0.1854934565
-#>  [558,] -1.1758058576
-#>  [559,]  0.4799492889
-#>  [560,]  0.2889615432
-#>  [561,] -1.2229386995
-#>  [562,] -0.6987219359
-#>  [563,] -0.7161481667
-#>  [564,] -0.6979187374
-#>  [565,] -0.3020466031
-#>  [566,] -0.4899953489
-#>  [567,] -0.8275962847
-#>  [568,] -0.4674950196
-#>  [569,]  0.1342948804
-#>  [570,]  0.4109874859
-#>  [571,]  0.6809664531
-#>  [572,]  0.0412525653
-#>  [573,] -0.1366350706
-#>  [574,] -1.1207337079
-#>  [575,]  0.3470067929
-#>  [576,] -0.0923409971
-#>  [577,] -0.3819336931
-#>  [578,]  0.8333035847
-#>  [579,] -0.8232234358
-#>  [580,]  0.4841882070
-#>  [581,]  0.3710572238
-#>  [582,] -0.1472150650
-#>  [583,] -0.6323914920
-#>  [584,] -0.0760915545
-#>  [585,]  0.3433258183
-#>  [586,]  0.2907435295
-#>  [587,]  0.1804655638
-#>  [588,]  0.0960746038
-#>  [589,]  0.6891781694
-#>  [590,] -0.5049569493
-#>  [591,]  1.2848835754
-#>  [592,] -0.3799283129
-#>  [593,]  0.7477702212
-#>  [594,] -0.1956200888
-#>  [595,] -0.4801320903
-#>  [596,] -1.1238694316
-#>  [597,] -0.1742729665
-#>  [598,]  0.7378953287
-#>  [599,] -0.3434189294
-#>  [600,] -0.1916673964
-#>  [601,]  0.5453891039
-#>  [602,]  0.5152067136
-#>  [603,] -0.0849465285
-#>  [604,] -0.9375702176
-#>  [605,]  0.0342861184
-#>  [606,] -0.6654940081
-#>  [607,]  0.1873345150
-#>  [608,] -0.0769441016
-#>  [609,]  0.0459690299
-#>  [610,] -1.1788679169
-#>  [611,]  0.3286415798
-#>  [612,] -0.0070398665
-#>  [613,]  0.0901108970
-#>  [614,] -0.6918504354
-#>  [615,] -0.4205800723
-#>  [616,]  0.4543268904
-#>  [617,] -1.0384554020
-#>  [618,]  0.1549874586
-#>  [619,]  0.0778153993
-#>  [620,]  0.7125930810
-#>  [621,] -0.4782826046
-#>  [622,]  0.0135671419
-#>  [623,]  0.4106809996
-#>  [624,] -1.0563256277
-#>  [625,] -0.9110756256
-#>  [626,]  0.4652583868
-#>  [627,]  0.0051119560
-#>  [628,] -0.7323652751
-#>  [629,]  0.1945666269
-#>  [630,]  0.1503672563
-#>  [631,] -0.4189320285
-#>  [632,] -0.1985243872
-#>  [633,]  0.3485440840
-#>  [634,] -0.2546306539
-#>  [635,]  0.1227093653
-#>  [636,] -0.1856114989
-#>  [637,]  0.2738320503
-#>  [638,]  1.0011583972
-#>  [639,]  0.4347908674
-#>  [640,] -1.6299630581
-#>  [641,]  0.2096862729
-#>  [642,]  0.0085548911
-#>  [643,]  0.8349020227
-#>  [644,] -0.3045636391
-#>  [645,]  0.6219698623
-#>  [646,] -0.2574906120
-#>  [647,]  0.0345353917
-#>  [648,]  0.0117664619
-#>  [649,] -1.4764422104
-#>  [650,] -0.1628241897
-#>  [651,] -1.2739376707
-#>  [652,]  0.8570820034
-#>  [653,]  0.1669292965
-#>  [654,] -0.5317850287
-#>  [655,] -1.0839194580
-#>  [656,] -0.3629707878
-#>  [657,]  0.2942403152
-#>  [658,] -0.7617545907
-#>  [659,] -0.1690545735
-#>  [660,]  0.4039956100
-#>  [661,] -0.3634582941
-#>  [662,] -0.8665629700
-#>  [663,] -0.0941815160
-#>  [664,]  0.5124719800
-#>  [665,]  0.3797310939
-#>  [666,]  0.4798095771
-#>  [667,] -0.5581899881
-#>  [668,]  0.3612915464
-#>  [669,]  0.5622974939
-#>  [670,]  0.1053961693
-#>  [671,]  0.8528432195
-#>  [672,]  0.3209320303
-#>  [673,] -0.2066703154
-#>  [674,] -0.4629168486
-#>  [675,]  0.0776318452
-#>  [676,]  0.0504121140
-#>  [677,]  0.0518265536
-#>  [678,]  0.2186372967
-#>  [679,]  0.9749493164
-#>  [680,] -1.1149482951
-#>  [681,]  0.3516361891
-#>  [682,]  0.3667470411
-#>  [683,]  0.8789232773
-#>  [684,] -0.2670357825
-#>  [685,] -0.1829090230
-#>  [686,]  0.1890744270
-#>  [687,]  1.0046635884
-#>  [688,]  0.3744975371
-#>  [689,] -0.0766459083
-#>  [690,]  0.6810551492
-#>  [691,]  0.4759922006
-#>  [692,]  0.6531461508
-#>  [693,]  1.4328980712
-#>  [694,] -0.7168506910
-#>  [695,] -0.9394506137
-#>  [696,]  0.2211753382
-#>  [697,] -0.6708343014
-#>  [698,] -0.6266708148
-#>  [699,] -0.2085801270
-#>  [700,] -0.5009781300
-#>  [701,] -0.0736209105
-#>  [702,]  0.0828169897
-#>  [703,]  0.3307929430
-#>  [704,] -0.7440077387
-#>  [705,] -0.3728347114
-#>  [706,]  0.2977447079
-#>  [707,]  0.7548204272
-#>  [708,]  0.3886572805
-#>  [709,]  0.4132856791
-#>  [710,]  0.1895251830
-#>  [711,]  0.3993992893
-#>  [712,]  0.9802321367
-#>  [713,]  0.7551475071
-#>  [714,] -0.2736283043
-#>  [715,]  0.1938512839
-#>  [716,]  0.2522079318
-#>  [717,]  0.4456332365
-#>  [718,] -0.1725801231
-#>  [719,]  1.0797039576
-#>  [720,]  0.3771421018
-#>  [721,]  1.0647146570
-#>  [722,]  0.5670786800
-#>  [723,] -0.3559502304
-#>  [724,] -0.7792681821
-#>  [725,]  0.3513208478
-#>  [726,] -0.2204885378
-#>  [727,] -0.7116021712
-#>  [728,] -0.1274112014
-#>  [729,]  0.1966007892
-#>  [730,] -0.3877896070
-#>  [731,] -0.0199313005
-#>  [732,]  0.1184631125
-#>  [733,]  0.2743273010
-#>  [734,]  0.5775105425
-#>  [735,] -0.5056774630
-#>  [736,] -0.2552224425
-#>  [737,] -0.6560176353
-#>  [738,]  0.0348101351
-#>  [739,]  0.0902873096
-#>  [740,] -0.6225028210
-#>  [741,]  0.0797128348
-#>  [742,] -0.1238000548
-#>  [743,] -0.2795868175
-#>  [744,]  0.4582617314
-#>  [745,] -0.2354719079
-#>  [746,]  0.2209533894
-#>  [747,] -0.5618179465
-#>  [748,]  0.2231021093
-#>  [749,]  0.4956384436
-#>  [750,] -0.5831960283
-#>  [751,]  0.2152613123
-#>  [752,]  0.0542747032
-#>  [753,] -0.2871950654
-#>  [754,]  0.8426783292
-#>  [755,]  0.7672623956
-#>  [756,]  0.2816446739
-#>  [757,] -0.2591984330
-#>  [758,] -0.3336978253
-#>  [759,]  0.3641738199
-#>  [760,]  0.9735269661
-#>  [761,] -0.3217634758
-#>  [762,] -0.7869635400
-#>  [763,] -0.4184585485
-#>  [764,] -0.4806272557
-#>  [765,] -0.8255505286
-#>  [766,] -0.5302860747
-#>  [767,]  1.3100438376
-#>  [768,] -0.9603983599
-#>  [769,] -0.0885776340
-#>  [770,]  0.2058034252
-#>  [771,] -0.7842468232
-#>  [772,]  0.0635044349
-#>  [773,] -0.6950875052
-#>  [774,] -0.1846452173
-#>  [775,] -0.3363920013
-#>  [776,] -0.1788561470
-#>  [777,]  0.8910436190
-#>  [778,] -0.1378227135
-#>  [779,] -0.5356006359
-#>  [780,]  0.3572819579
-#>  [781,]  0.1585347313
-#>  [782,]  1.0687287745
-#>  [783,]  1.1066133406
-#>  [784,] -0.2037504826
-#>  [785,]  0.9385727458
-#>  [786,]  0.6147191507
-#>  [787,] -0.6015363271
-#>  [788,]  0.1344273146
-#>  [789,] -1.2289859526
-#>  [790,] -0.2334185391
-#>  [791,]  0.6008626409
-#>  [792,] -0.3406541746
-#>  [793,]  0.0389000135
-#>  [794,]  0.6983003709
-#>  [795,]  0.3481336234
-#>  [796,] -1.3028989554
-#>  [797,] -0.2717435179
-#>  [798,] -0.2855132968
-#>  [799,] -0.0936070333
-#>  [800,] -0.3429509998
-#>  [801,]  0.0655776669
-#>  [802,]  0.4265438505
-#>  [803,] -0.1910306454
-#>  [804,] -0.9140136202
-#>  [805,]  0.3288425975
-#>  [806,] -0.8873754493
-#>  [807,]  1.0038235569
-#>  [808,]  0.9868305517
-#>  [809,] -0.2429636438
-#>  [810,] -0.9556180721
-#>  [811,]  0.4624106351
-#>  [812,]  0.3846051532
-#>  [813,]  0.2159064515
-#>  [814,]  0.6700672870
-#>  [815,] -0.4725897050
-#>  [816,] -0.4929518906
-#>  [817,]  0.0322191879
-#>  [818,]  0.3226393176
-#>  [819,] -0.6958534240
-#>  [820,]  0.9750456384
-#>  [821,] -0.2351493784
-#>  [822,]  0.0729391805
-#>  [823,] -0.1591423649
-#>  [824,] -0.5117309414
-#>  [825,] -0.4795095958
-#>  [826,]  0.4052688752
-#>  [827,]  0.4204315647
-#>  [828,]  0.2745312392
-#>  [829,] -0.0205289924
-#>  [830,] -0.4314073568
-#>  [831,]  0.6094918348
-#>  [832,]  1.0722886897
-#>  [833,] -0.2645977153
-#>  [834,] -0.3071153523
-#>  [835,] -1.0247537799
-#>  [836,] -0.0066203198
-#>  [837,] -0.3715043925
-#>  [838,] -0.9059665162
-#>  [839,]  0.3446574226
-#>  [840,] -0.4288151695
-#>  [841,]  0.5646785101
-#>  [842,] -0.3737684092
-#>  [843,]  0.0442044857
-#>  [844,] -0.3987089975
-#>  [845,] -0.7878751902
-#>  [846,]  0.2526558932
-#>  [847,] -0.7940216721
-#>  [848,]  0.9473900905
-#>  [849,] -0.4694223589
-#>  [850,]  0.3828941189
-#>  [851,]  0.6224105475
-#>  [852,] -0.5851015896
-#>  [853,]  0.0889057826
-#>  [854,] -0.7938766278
-#>  [855,]  0.3155334026
-#>  [856,] -0.1221232804
-#>  [857,] -1.3300195007
-#>  [858,] -0.5719212348
-#>  [859,] -0.9125609384
-#>  [860,] -0.2369346297
-#>  [861,] -0.1245148780
-#>  [862,]  0.1233000140
-#>  [863,] -0.3210504101
-#>  [864,]  0.2492006992
-#>  [865,] -0.2825086429
-#>  [866,] -0.5326912742
-#>  [867,]  0.8425287094
-#>  [868,] -0.1497211783
-#>  [869,] -0.0707894714
-#>  [870,]  1.4702293019
-#>  [871,]  0.3788441173
-#>  [872,]  0.1531670624
-#>  [873,] -0.0760079516
-#>  [874,]  0.4299880763
-#>  [875,]  0.2210118748
-#>  [876,]  0.2148637327
-#>  [877,]  0.1065667170
-#>  [878,]  0.3748418794
-#>  [879,]  1.3183723882
-#>  [880,]  0.1440785278
-#>  [881,] -0.2546857904
-#>  [882,]  0.3841561647
-#>  [883,] -0.4562233748
-#>  [884,]  0.0205479356
-#>  [885,] -0.5283052893
-#>  [886,] -0.0380575119
-#>  [887,]  0.8189095851
-#>  [888,] -0.3172733240
-#>  [889,] -0.0775247548
-#>  [890,]  0.6523233123
-#>  [891,] -0.5291967793
-#>  [892,] -0.2480709824
-#>  [893,] -0.5409294040
-#>  [894,]  1.6438647924
-#>  [895,] -0.0285473602
-#>  [896,]  0.5037505007
-#>  [897,]  0.1677080631
-#>  [898,]  0.4745067744
-#>  [899,] -0.3244861939
-#>  [900,]  0.2792913243
-#>  [901,] -0.5483960392
-#>  [902,] -0.0305749669
-#>  [903,] -0.1514603314
-#>  [904,]  0.2612410255
-#>  [905,]  0.2779296922
-#>  [906,] -0.5204567438
-#>  [907,]  0.2379697183
-#>  [908,] -0.0438160738
-#>  [909,] -0.1526747367
-#>  [910,] -0.0887330336
-#>  [911,] -0.1575867912
-#>  [912,]  0.1630557708
-#>  [913,]  0.7016753047
-#>  [914,] -0.8003311557
-#>  [915,] -0.5517455382
-#>  [916,]  0.5581515129
-#>  [917,]  0.9733421026
-#>  [918,]  0.4126615822
-#>  [919,]  0.2656229969
-#>  [920,]  0.9628071016
-#>  [921,] -0.9312067534
-#>  [922,] -0.4634455202
-#>  [923,] -1.3692829613
-#>  [924,]  0.2544472271
-#>  [925,]  0.4049660112
-#>  [926,] -0.8171301071
-#>  [927,]  0.9692648139
-#>  [928,]  0.2155638727
-#>  [929,] -0.0075314663
-#>  [930,] -0.3707470096
-#>  [931,]  0.3387124092
-#>  [932,]  0.6080674524
-#>  [933,]  0.3844711084
-#>  [934,] -0.4456982781
-#>  [935,]  0.4762807668
-#>  [936,]  0.8586590271
-#>  [937,] -0.8078057559
-#>  [938,]  1.1776087750
-#>  [939,]  0.2418545468
-#>  [940,]  0.3335388192
-#>  [941,]  0.1285051732
-#>  [942,]  1.3411563387
-#>  [943,] -0.5558981950
-#>  [944,]  0.1590944842
-#>  [945,] -0.6951189757
-#>  [946,] -0.2605388590
-#>  [947,] -0.5783436803
-#>  [948,]  0.3986646311
-#>  [949,] -0.1698432634
-#>  [950,]  0.3858898592
-#>  [951,]  0.2774471829
-#>  [952,]  0.9474389006
-#>  [953,]  0.2077068563
-#>  [954,]  0.2806173791
-#>  [955,] -0.1963264975
-#>  [956,] -0.8030974166
-#>  [957,] -0.2807482662
-#>  [958,] -0.3026745665
-#>  [959,]  0.5083256933
-#>  [960,] -0.2461689204
-#>  [961,] -0.4289212344
-#>  [962,]  0.7402211651
-#>  [963,]  0.4969454558
-#>  [964,] -0.2984586746
-#>  [965,]  1.1478120924
-#>  [966,]  0.4754655764
-#>  [967,]  0.3991696073
-#>  [968,] -0.9194252349
-#>  [969,]  0.1032745219
-#>  [970,]  0.8412753667
-#>  [971,]  0.0857662245
-#>  [972,] -0.0358825081
-#>  [973,] -0.6591380693
-#>  [974,] -0.0544398507
-#>  [975,]  0.0107345295
-#>  [976,] -1.0040146620
-#>  [977,]  0.2431172533
-#>  [978,] -0.2085764904
-#>  [979,] -0.5573452864
-#>  [980,] -0.0040646845
-#>  [981,] -0.1772517418
-#>  [982,] -0.1807434915
-#>  [983,] -0.7999411671
-#>  [984,]  0.6381955520
-#>  [985,] -0.7711446892
-#>  [986,] -0.5225992541
-#>  [987,]  0.0978367780
-#>  [988,] -0.2031551713
-#>  [989,] -0.0101076912
-#>  [990,] -0.1496888327
-#>  [991,] -0.2085557226
-#>  [992,]  0.6977805953
-#>  [993,]  0.2173102994
-#>  [994,]  0.4405124281
-#>  [995,] -0.0108878601
-#>  [996,]  0.1153961412
-#>  [997,] -0.3793953827
-#>  [998,] -0.6079843124
-#>  [999,]  0.6614656504
-#> [1000,] -0.0739641974
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/make_sparse_diagonal_matrix.html b/docs/reference/make_sparse_diagonal_matrix.html index aefd2af1..2dd59c74 100644 --- a/docs/reference/make_sparse_diagonal_matrix.html +++ b/docs/reference/make_sparse_diagonal_matrix.html @@ -1,9 +1,9 @@ -Make a CSC sparse diagonal matrix — make_sparse_diagonal_matrix • CVXRMake a CSC sparse diagonal matrix — make_sparse_diagonal_matrix • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Make a CSC sparse diagonal matrix

Arguments

-
size
+ + +
size

number of rows or columns

-
diagonal
+
diagonal

if specified, the diagonal values, in which case size is ignored

Value

- - -

a compressed sparse column diagonal matrix

+

a compressed sparse column diagonal matrix

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/matrix_frac.html b/docs/reference/matrix_frac.html index 4842e115..5290647b 100644 --- a/docs/reference/matrix_frac.html +++ b/docs/reference/matrix_frac.html @@ -1,9 +1,9 @@ -Matrix Fraction — matrix_frac • CVXRMatrix Fraction — matrix_frac • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,24 +71,24 @@

Matrix Fraction

Arguments

-
X
+ + +
X

An Expression or matrix. Must have the same number of rows as P.

-
P
+
P

An Expression or matrix. Must be an invertible square matrix.

Value

- - -

An Expression representing the matrix fraction evaluated at the input.

+

An Expression representing the matrix fraction evaluated at the input.

Examples

-
if (FALSE) {
+    
if (FALSE) { # \dontrun{
 set.seed(192)
 m <- 100
 n <- 80
@@ -111,7 +111,7 @@ 

Examples

prob <- Problem(Minimize(obj), constr) result <- solve(prob) result$value -} +} # }
@@ -126,15 +126,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/matrix_prop-methods.html b/docs/reference/matrix_prop-methods.html index ca4fffa1..22cc84cc 100644 --- a/docs/reference/matrix_prop-methods.html +++ b/docs/reference/matrix_prop-methods.html @@ -1,9 +1,9 @@ -Matrix Properties — matrix_prop-methods • CVXRMatrix Properties — matrix_prop-methods • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -77,15 +77,15 @@

Matrix Properties

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A logical value.

+

A logical value.

@@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/matrix_trace.html b/docs/reference/matrix_trace.html index 482a4a96..1f4d3972 100644 --- a/docs/reference/matrix_trace.html +++ b/docs/reference/matrix_trace.html @@ -1,9 +1,9 @@ -Matrix Trace — matrix_trace • CVXRMatrix Trace — matrix_trace • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Matrix Trace

Arguments

-
expr
+ + +
expr

An Expression or matrix.

Value

- - -

An Expression representing the trace of the input.

+

An Expression representing the trace of the input.

@@ -104,15 +104,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/max.Expression.html b/docs/reference/max.Expression.html new file mode 100644 index 00000000..d52891c1 --- /dev/null +++ b/docs/reference/max.Expression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/max.html b/docs/reference/max.html new file mode 100644 index 00000000..d52891c1 --- /dev/null +++ b/docs/reference/max.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/max_elemwise.html b/docs/reference/max_elemwise.html index 0b27f476..a4488dba 100644 --- a/docs/reference/max_elemwise.html +++ b/docs/reference/max_elemwise.html @@ -1,9 +1,9 @@ -Elementwise Maximum — max_elemwise • CVXRElementwise Maximum — max_elemwise • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Elementwise Maximum

Arguments

-
arg1
+ + +
arg1

An Expression, vector, or matrix.

-
arg2
+
arg2

An Expression, vector, or matrix.

-
...
+
...

Additional Expression objects, vectors, or matrices.

Value

- - -

An Expression representing the elementwise maximum of the inputs.

+

An Expression representing the elementwise maximum of the inputs.

@@ -111,15 +111,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/max_entries.html b/docs/reference/max_entries.html index 86bebba9..53c29cc0 100644 --- a/docs/reference/max_entries.html +++ b/docs/reference/max_entries.html @@ -1,9 +1,9 @@ -Maximum — max_entries • CVXRMaximum — max_entries • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,37 +68,37 @@

Maximum

max_entries(x, axis = NA_real_, keepdims = FALSE)
 
-# S3 method for Expression
+# S3 method for class 'Expression'
 max(..., na.rm = FALSE)

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
...
+
...

Numeric scalar, vector, matrix, or Expression objects.

-
na.rm
+
na.rm

(Unimplemented) A logical value indicating whether missing values should be removed.

Value

- - -

An Expression representing the maximum of the input.

+

An Expression representing the maximum of the input.

@@ -143,15 +143,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/mean.html b/docs/reference/mean.html index fe819234..85262915 100644 --- a/docs/reference/mean.html +++ b/docs/reference/mean.html @@ -1,9 +1,9 @@ -Arithmetic Mean — mean.Expression • CVXRArithmetic Mean — mean.Expression • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,33 +66,33 @@

Arithmetic Mean

-
# S3 method for Expression
+    
# S3 method for class 'Expression'
 mean(x, trim = 0, na.rm = FALSE, ...)

Arguments

-
x
+ + +
x

An Expression object.

-
trim
+
trim

(Unimplemented) The fraction (0 to 0.5) of observations to be trimmed from each end of \(x\) before the mean is computed.

-
na.rm
+
na.rm

(Unimplemented) A logical value indicating whether missing values should be removed.

-
...
+
...

(Unimplemented) Optional arguments.

Value

- - -

An Expression representing the mean of the input.

+

An Expression representing the mean of the input.

@@ -117,15 +117,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/min.Expression.html b/docs/reference/min.Expression.html new file mode 100644 index 00000000..a4c96658 --- /dev/null +++ b/docs/reference/min.Expression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/min.html b/docs/reference/min.html new file mode 100644 index 00000000..a4c96658 --- /dev/null +++ b/docs/reference/min.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/min_elemwise.html b/docs/reference/min_elemwise.html index 7bd945b9..3572e886 100644 --- a/docs/reference/min_elemwise.html +++ b/docs/reference/min_elemwise.html @@ -1,9 +1,9 @@ -Elementwise Minimum — min_elemwise • CVXRElementwise Minimum — min_elemwise • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Elementwise Minimum

Arguments

-
arg1
+ + +
arg1

An Expression, vector, or matrix.

-
arg2
+
arg2

An Expression, vector, or matrix.

-
...
+
...

Additional Expression objects, vectors, or matrices.

Value

- - -

An Expression representing the elementwise minimum of the inputs.

+

An Expression representing the elementwise minimum of the inputs.

@@ -112,15 +112,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/min_entries.html b/docs/reference/min_entries.html index b61e14f4..5999d62f 100644 --- a/docs/reference/min_entries.html +++ b/docs/reference/min_entries.html @@ -1,9 +1,9 @@ -Minimum — min_entries • CVXRMinimum — min_entries • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,37 +68,37 @@

Minimum

min_entries(x, axis = NA_real_, keepdims = FALSE)
 
-# S3 method for Expression
+# S3 method for class 'Expression'
 min(..., na.rm = FALSE)

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
...
+
...

Numeric scalar, vector, matrix, or Expression objects.

-
na.rm
+
na.rm

(Unimplemented) A logical value indicating whether missing values should be removed.

Value

- - -

An Expression representing the minimum of the input.

+

An Expression representing the minimum of the input.

@@ -129,15 +129,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/mip_capable,CBC_CONIC-method.html b/docs/reference/mip_capable,CBC_CONIC-method.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/mip_capable,CBC_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,CLARABEL-method.html b/docs/reference/mip_capable,CLARABEL-method.html new file mode 100644 index 00000000..7b9f7df2 --- /dev/null +++ b/docs/reference/mip_capable,CLARABEL-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,CPLEX_CONIC-method.html b/docs/reference/mip_capable,CPLEX_CONIC-method.html new file mode 100644 index 00000000..4665af60 --- /dev/null +++ b/docs/reference/mip_capable,CPLEX_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,CPLEX_QP-method.html b/docs/reference/mip_capable,CPLEX_QP-method.html new file mode 100644 index 00000000..a63ea235 --- /dev/null +++ b/docs/reference/mip_capable,CPLEX_QP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,CVXOPT-method.html b/docs/reference/mip_capable,CVXOPT-method.html new file mode 100644 index 00000000..8a01311e --- /dev/null +++ b/docs/reference/mip_capable,CVXOPT-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,ConstantSolver-method.html b/docs/reference/mip_capable,ConstantSolver-method.html new file mode 100644 index 00000000..563daa80 --- /dev/null +++ b/docs/reference/mip_capable,ConstantSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,ECOS-method.html b/docs/reference/mip_capable,ECOS-method.html new file mode 100644 index 00000000..35ec5a21 --- /dev/null +++ b/docs/reference/mip_capable,ECOS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,ECOS_BB-method.html b/docs/reference/mip_capable,ECOS_BB-method.html new file mode 100644 index 00000000..55db89f5 --- /dev/null +++ b/docs/reference/mip_capable,ECOS_BB-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,GLPK-method.html b/docs/reference/mip_capable,GLPK-method.html new file mode 100644 index 00000000..b74a96a9 --- /dev/null +++ b/docs/reference/mip_capable,GLPK-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,GLPK_MI-method.html b/docs/reference/mip_capable,GLPK_MI-method.html new file mode 100644 index 00000000..b8d9c012 --- /dev/null +++ b/docs/reference/mip_capable,GLPK_MI-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,GUROBI_CONIC-method.html b/docs/reference/mip_capable,GUROBI_CONIC-method.html new file mode 100644 index 00000000..f4a1f642 --- /dev/null +++ b/docs/reference/mip_capable,GUROBI_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,GUROBI_QP-method.html b/docs/reference/mip_capable,GUROBI_QP-method.html new file mode 100644 index 00000000..de519b9c --- /dev/null +++ b/docs/reference/mip_capable,GUROBI_QP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,MOSEK-method.html b/docs/reference/mip_capable,MOSEK-method.html new file mode 100644 index 00000000..4b67fe4e --- /dev/null +++ b/docs/reference/mip_capable,MOSEK-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,ReductionSolver-method.html b/docs/reference/mip_capable,ReductionSolver-method.html new file mode 100644 index 00000000..11a3d8b1 --- /dev/null +++ b/docs/reference/mip_capable,ReductionSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable,SCS-method.html b/docs/reference/mip_capable,SCS-method.html new file mode 100644 index 00000000..5e0523ec --- /dev/null +++ b/docs/reference/mip_capable,SCS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/mip_capable.html b/docs/reference/mip_capable.html index e876c578..26835449 100644 --- a/docs/reference/mip_capable.html +++ b/docs/reference/mip_capable.html @@ -1,9 +1,9 @@ -Solver Capabilities — mip_capable • CVXRSolver Capabilities — mip_capable • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Solver Capabilities

Arguments

-
solver
+ + +
solver

A ReductionSolver object.

Value

- - -

A logical value.

+

A logical value.

@@ -100,15 +100,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/mixed_norm.html b/docs/reference/mixed_norm.html index c46b5d5a..b7992916 100644 --- a/docs/reference/mixed_norm.html +++ b/docs/reference/mixed_norm.html @@ -1,9 +1,9 @@ -Mixed Norm — mixed_norm • CVXRMixed Norm — mixed_norm • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Mixed Norm

Arguments

-
X
+ + +
X

An Expression, vector, or matrix.

-
p
+
p

The type of inner norm.

-
q
+
q

The type of outer norm.

Value

- - -

An Expression representing the \(l_{p,q}\) norm of the input.

+

An Expression representing the \(l_{p,q}\) norm of the input.

@@ -126,15 +126,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/mul_elemwise.html b/docs/reference/mul_elemwise.html index e7ec5ed1..7c12bf36 100644 --- a/docs/reference/mul_elemwise.html +++ b/docs/reference/mul_elemwise.html @@ -1,9 +1,9 @@ -Elementwise multiplication operator — *,Expression,Expression-method • CVXRElementwise multiplication operator — *,Expression,Expression-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,19 +66,21 @@

Elementwise multiplication operator

-
# S4 method for Expression,Expression
-*(e1, e2)
-
-# S4 method for Expression,ConstVal
-*(e1, e2)
-
-# S4 method for ConstVal,Expression
-*(e1, e2)
+
# S4 method for class 'Expression,Expression'
+e1 * e2
+
+# S4 method for class 'Expression,ConstVal'
+e1 * e2
+
+# S4 method for class 'ConstVal,Expression'
+e1 * e2

Arguments

-
e1, e2
+ + +
e1, e2

The Expression objects or numeric constants to multiply elementwise.

@@ -95,15 +97,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/multiply.html b/docs/reference/multiply.html index 99526581..99f85b11 100644 --- a/docs/reference/multiply.html +++ b/docs/reference/multiply.html @@ -1,128 +1,8 @@ - -Elementwise Multiplication — multiply • CVXR - - -
-
- - - -
-
- - -
-

The elementwise product of two expressions. The first expression must be constant.

-
- -
-
multiply(lh_exp, rh_exp)
-
- -
-

Arguments

-
lh_exp
-

An Expression, vector, or matrix representing the left-hand value.

- - -
rh_exp
-

An Expression, vector, or matrix representing the right-hand value.

- -
-
-

Value

- - -

An Expression representing the elementwise product of the inputs.

-
- -
-

Examples

-
A <- Variable(2,2)
-c <- cbind(c(1,-1), c(2,-2))
-expr <- multiply(c, A)
-obj <- Minimize(norm_inf(expr))
-prob <- Problem(obj, list(A == 5))
-result <- solve(prob)
-result$value
-#> [1] 10
-result$getValue(expr)
-#>      [,1] [,2]
-#> [1,]    5   10
-#> [2,]   -5  -10
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/name,AddExpression-method.html b/docs/reference/name,AddExpression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/name,AddExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,Atom-method.html b/docs/reference/name,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/name,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,BinaryOperator-method.html b/docs/reference/name,BinaryOperator-method.html new file mode 100644 index 00000000..0ce00269 --- /dev/null +++ b/docs/reference/name,BinaryOperator-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,CBC_CONIC-method.html b/docs/reference/name,CBC_CONIC-method.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/name,CBC_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,CLARABEL-method.html b/docs/reference/name,CLARABEL-method.html new file mode 100644 index 00000000..7b9f7df2 --- /dev/null +++ b/docs/reference/name,CLARABEL-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,CPLEX_CONIC-method.html b/docs/reference/name,CPLEX_CONIC-method.html new file mode 100644 index 00000000..4665af60 --- /dev/null +++ b/docs/reference/name,CPLEX_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,CPLEX_QP-method.html b/docs/reference/name,CPLEX_QP-method.html new file mode 100644 index 00000000..a63ea235 --- /dev/null +++ b/docs/reference/name,CPLEX_QP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,CVXOPT-method.html b/docs/reference/name,CVXOPT-method.html new file mode 100644 index 00000000..8a01311e --- /dev/null +++ b/docs/reference/name,CVXOPT-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,Constant-method.html b/docs/reference/name,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/name,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,ConstantSolver-method.html b/docs/reference/name,ConstantSolver-method.html new file mode 100644 index 00000000..563daa80 --- /dev/null +++ b/docs/reference/name,ConstantSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,ECOS-method.html b/docs/reference/name,ECOS-method.html new file mode 100644 index 00000000..35ec5a21 --- /dev/null +++ b/docs/reference/name,ECOS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,ECOS_BB-method.html b/docs/reference/name,ECOS_BB-method.html new file mode 100644 index 00000000..55db89f5 --- /dev/null +++ b/docs/reference/name,ECOS_BB-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,EqConstraint-method.html b/docs/reference/name,EqConstraint-method.html new file mode 100644 index 00000000..9ee425a1 --- /dev/null +++ b/docs/reference/name,EqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,Expression-method.html b/docs/reference/name,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/name,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,EyeMinusInv-method.html b/docs/reference/name,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/name,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,GLPK-method.html b/docs/reference/name,GLPK-method.html new file mode 100644 index 00000000..b74a96a9 --- /dev/null +++ b/docs/reference/name,GLPK-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,GLPK_MI-method.html b/docs/reference/name,GLPK_MI-method.html new file mode 100644 index 00000000..b8d9c012 --- /dev/null +++ b/docs/reference/name,GLPK_MI-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,GUROBI_CONIC-method.html b/docs/reference/name,GUROBI_CONIC-method.html new file mode 100644 index 00000000..f4a1f642 --- /dev/null +++ b/docs/reference/name,GUROBI_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,GUROBI_QP-method.html b/docs/reference/name,GUROBI_QP-method.html new file mode 100644 index 00000000..de519b9c --- /dev/null +++ b/docs/reference/name,GUROBI_QP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,GeoMean-method.html b/docs/reference/name,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/name,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,IneqConstraint-method.html b/docs/reference/name,IneqConstraint-method.html new file mode 100644 index 00000000..d750b8f5 --- /dev/null +++ b/docs/reference/name,IneqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,MOSEK-method.html b/docs/reference/name,MOSEK-method.html new file mode 100644 index 00000000..4b67fe4e --- /dev/null +++ b/docs/reference/name,MOSEK-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,NonPosConstraint-method.html b/docs/reference/name,NonPosConstraint-method.html new file mode 100644 index 00000000..687578bd --- /dev/null +++ b/docs/reference/name,NonPosConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,Norm1-method.html b/docs/reference/name,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/name,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,NormInf-method.html b/docs/reference/name,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/name,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,OSQP-method.html b/docs/reference/name,OSQP-method.html new file mode 100644 index 00000000..898d17aa --- /dev/null +++ b/docs/reference/name,OSQP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,OneMinusPos-method.html b/docs/reference/name,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/name,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,PSDConstraint-method.html b/docs/reference/name,PSDConstraint-method.html new file mode 100644 index 00000000..0f746d96 --- /dev/null +++ b/docs/reference/name,PSDConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,Parameter-method.html b/docs/reference/name,Parameter-method.html new file mode 100644 index 00000000..2f7668bf --- /dev/null +++ b/docs/reference/name,Parameter-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,PfEigenvalue-method.html b/docs/reference/name,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/name,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,Pnorm-method.html b/docs/reference/name,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/name,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,Power-method.html b/docs/reference/name,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/name,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,QuadForm-method.html b/docs/reference/name,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/name,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,ReductionSolver-method.html b/docs/reference/name,ReductionSolver-method.html new file mode 100644 index 00000000..11a3d8b1 --- /dev/null +++ b/docs/reference/name,ReductionSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,SCS-method.html b/docs/reference/name,SCS-method.html new file mode 100644 index 00000000..5e0523ec --- /dev/null +++ b/docs/reference/name,SCS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,SpecialIndex-method.html b/docs/reference/name,SpecialIndex-method.html new file mode 100644 index 00000000..63c77200 --- /dev/null +++ b/docs/reference/name,SpecialIndex-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,UnaryOperator-method.html b/docs/reference/name,UnaryOperator-method.html new file mode 100644 index 00000000..67e5d145 --- /dev/null +++ b/docs/reference/name,UnaryOperator-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,Variable-method.html b/docs/reference/name,Variable-method.html new file mode 100644 index 00000000..32eadf30 --- /dev/null +++ b/docs/reference/name,Variable-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name,ZeroConstraint-method.html b/docs/reference/name,ZeroConstraint-method.html new file mode 100644 index 00000000..10615fe5 --- /dev/null +++ b/docs/reference/name,ZeroConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/name.html b/docs/reference/name.html index b3dced8b..e03116b8 100644 --- a/docs/reference/name.html +++ b/docs/reference/name.html @@ -1,9 +1,9 @@ -Variable, Parameter, or Expression Name — name • CVXRVariable, Parameter, or Expression Name — name • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Variable, Parameter, or Expression Name

Arguments

-
x
+ + +
x

A Variable, Parameter, or Expression object.

Value

- - -

For Variable or Parameter objects, the value in the name slot. For Expression objects, a string indicating the nested atoms and their respective arguments.

+

For Variable or Parameter objects, the value in the name slot. For Expression objects, a string indicating the nested atoms and their respective arguments.

@@ -105,15 +105,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/names,DgpCanonMethods-method.html b/docs/reference/names,DgpCanonMethods-method.html new file mode 100644 index 00000000..1922f56e --- /dev/null +++ b/docs/reference/names,DgpCanonMethods-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/ncol,Atom-method.html b/docs/reference/ncol,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/ncol,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/ncol,Expression-method.html b/docs/reference/ncol,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/ncol,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/ndim,Expression-method.html b/docs/reference/ndim,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/ndim,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/neg.html b/docs/reference/neg.html index dd317bc9..0db62273 100644 --- a/docs/reference/neg.html +++ b/docs/reference/neg.html @@ -1,9 +1,9 @@ -Elementwise Negative — neg • CVXRElementwise Negative — neg • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Elementwise Negative

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

Value

- - -

An Expression representing the negative portion of the input.

+

An Expression representing the negative portion of the input.

@@ -104,15 +104,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/norm.html b/docs/reference/norm.html index 44b7730a..410219f5 100644 --- a/docs/reference/norm.html +++ b/docs/reference/norm.html @@ -1,9 +1,9 @@ -Matrix Norm — norm,Expression,character-method • CVXRMatrix Norm — norm,Expression,character-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,17 +66,19 @@

Matrix Norm

-
# S4 method for Expression,character
+    
# S4 method for class 'Expression,character'
 norm(x, type)

Arguments

-
x
+ + +
x

An Expression.

-
type
+
type

A character indicating the type of norm desired.

  • "O", "o" or "1" specifies the 1-norm (maximum absolute column sum).

  • "I" or "i" specifies the infinity-norm (maximum absolute row sum).

  • "F" or "f" specifies the Frobenius norm (Euclidean norm of the vectorized x).

  • @@ -87,9 +89,7 @@

    Arguments

Value

- - -

An Expression representing the norm of the input.

+

An Expression representing the norm of the input.

See also

@@ -118,15 +118,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/norm1.html b/docs/reference/norm1.html index 1780d0cb..8e2238d8 100644 --- a/docs/reference/norm1.html +++ b/docs/reference/norm1.html @@ -1,143 +1,8 @@ - -1-Norm — norm1 • CVXR - - -
-
- - - -
-
- - -
-

\(\|x\|_1 = \sum_{i=1}^n |x_i|\).

-
- -
-
norm1(x, axis = NA_real_, keepdims = FALSE)
-
- -
-

Arguments

-
x
-

An Expression, vector, or matrix.

- - -
axis
-

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

- - -
keepdims
-

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

- -
-
-

Value

- - -

An Expression representing the 1-norm of the input.

-
- -
-

Examples

-
a <- Variable()
-prob <- Problem(Minimize(norm1(a)), list(a <= -2))
-result <- solve(prob)
-result$value
-#> [1] 2
-result$getValue(a)
-#> [1] -2
-
-prob <- Problem(Maximize(-norm1(a)), list(a <= -2))
-result <- solve(prob)
-result$value
-#> [1] -2
-result$getValue(a)
-#> [1] -2
-
-x <- Variable(2)
-z <- Variable(2)
-prob <- Problem(Minimize(norm1(x - z) + 5), list(x >= c(2,3), z <= c(-1,-4)))
-result <- solve(prob)
-result$value
-#> [1] 15
-result$getValue(x[1] - z[1])
-#> [1] 3
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/norm2.html b/docs/reference/norm2.html index 5d30de3d..fd021c55 100644 --- a/docs/reference/norm2.html +++ b/docs/reference/norm2.html @@ -1,9 +1,9 @@ -Euclidean Norm — norm2 • CVXREuclidean Norm — norm2 • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Euclidean Norm

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

Value

- - -

An Expression representing the Euclidean norm of the input.

+

An Expression representing the Euclidean norm of the input.

@@ -148,15 +148,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/norm_inf.html b/docs/reference/norm_inf.html index 5dadfa48..95f4f5ca 100644 --- a/docs/reference/norm_inf.html +++ b/docs/reference/norm_inf.html @@ -1,9 +1,9 @@ -Infinity-Norm — norm_inf • CVXRInfinity-Norm — norm_inf • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,23 +71,23 @@

Infinity-Norm

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

Value

- - -

An Expression representing the infinity-norm of the input.

+

An Expression representing the infinity-norm of the input.

@@ -141,15 +141,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/norm_nuc.html b/docs/reference/norm_nuc.html index c8d86957..07364493 100644 --- a/docs/reference/norm_nuc.html +++ b/docs/reference/norm_nuc.html @@ -1,9 +1,9 @@ -Nuclear Norm — norm_nuc • CVXRNuclear Norm — norm_nuc • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Nuclear Norm

Arguments

-
A
+ + +
A

An Expression or matrix.

Value

- - -

An Expression representing the nuclear norm of the input.

+

An Expression representing the nuclear norm of the input.

@@ -104,15 +104,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/nrow,Atom-method.html b/docs/reference/nrow,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/nrow,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/nrow,Expression-method.html b/docs/reference/nrow,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/nrow,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/num_cones,ExpCone-method.html b/docs/reference/num_cones,ExpCone-method.html new file mode 100644 index 00000000..ec35993c --- /dev/null +++ b/docs/reference/num_cones,ExpCone-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/num_cones,SOC-method.html b/docs/reference/num_cones,SOC-method.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/num_cones,SOC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/num_cones,SOCAxis-method.html b/docs/reference/num_cones,SOCAxis-method.html new file mode 100644 index 00000000..07ea6c39 --- /dev/null +++ b/docs/reference/num_cones,SOCAxis-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/num_cones.html b/docs/reference/num_cones.html new file mode 100644 index 00000000..94602144 --- /dev/null +++ b/docs/reference/num_cones.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/objective,Problem-method.html b/docs/reference/objective,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/objective,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/objective.html b/docs/reference/objective.html new file mode 100644 index 00000000..6c63d296 --- /dev/null +++ b/docs/reference/objective.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/one_minus_pos.html b/docs/reference/one_minus_pos.html index 497119a0..43d4750d 100644 --- a/docs/reference/one_minus_pos.html +++ b/docs/reference/one_minus_pos.html @@ -1,9 +1,9 @@ -Difference on Restricted Domain — one_minus_pos • CVXRDifference on Restricted Domain — one_minus_pos • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Difference on Restricted Domain

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

Value

- - -

An Expression representing one minus the input restricted to \((0,1)\).

+

An Expression representing one minus the input restricted to \((0,1)\).

Details

@@ -113,15 +113,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/p_norm.html b/docs/reference/p_norm.html index 30a18bcd..6f975ac1 100644 --- a/docs/reference/p_norm.html +++ b/docs/reference/p_norm.html @@ -1,9 +1,9 @@ -P-Norm — p_norm • CVXRP-Norm — p_norm • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,31 +71,31 @@

P-Norm

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
p
+
p

A number greater than or equal to 1, or equal to positive infinity.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
max_denom
+
max_denom

(Optional) The maximum denominator considered in forming a rational approximation for \(p\). The default is 1024.

Value

- - -

An Expression representing the p-norm of the input.

+

An Expression representing the p-norm of the input.

Details

@@ -129,7 +129,7 @@

Examples

#> [2,] 0.000000e+00 #> [3,] 0.000000e+00 -if (FALSE) { +if (FALSE) { # \dontrun{ a <- c(1.0, 2, 3) prob <- Problem(Minimize(p_norm(x,1.6)), list(t(x) %*% a >= 1)) result <- solve(prob) @@ -140,7 +140,7 @@

Examples

result <- solve(prob) result$value result$getValue(x) -} +} # }
@@ -155,15 +155,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/parameters,Canonical-method.html b/docs/reference/parameters,Canonical-method.html new file mode 100644 index 00000000..92de4b10 --- /dev/null +++ b/docs/reference/parameters,Canonical-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/parameters,Leaf-method.html b/docs/reference/parameters,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/parameters,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/parameters,Parameter-method.html b/docs/reference/parameters,Parameter-method.html new file mode 100644 index 00000000..2f7668bf --- /dev/null +++ b/docs/reference/parameters,Parameter-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/parameters,Problem-method.html b/docs/reference/parameters,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/parameters,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/parameters.html b/docs/reference/parameters.html new file mode 100644 index 00000000..d9cc208a --- /dev/null +++ b/docs/reference/parameters.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,CBC_CONIC,Problem-method.html b/docs/reference/perform,CBC_CONIC,Problem-method.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/perform,CBC_CONIC,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,CLARABEL,Problem-method.html b/docs/reference/perform,CLARABEL,Problem-method.html new file mode 100644 index 00000000..7b9f7df2 --- /dev/null +++ b/docs/reference/perform,CLARABEL,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,CPLEX_CONIC,Problem-method.html b/docs/reference/perform,CPLEX_CONIC,Problem-method.html new file mode 100644 index 00000000..4665af60 --- /dev/null +++ b/docs/reference/perform,CPLEX_CONIC,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,CVXOPT,Problem-method.html b/docs/reference/perform,CVXOPT,Problem-method.html new file mode 100644 index 00000000..8a01311e --- /dev/null +++ b/docs/reference/perform,CVXOPT,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,Canonicalization,Problem-method.html b/docs/reference/perform,Canonicalization,Problem-method.html new file mode 100644 index 00000000..2887cd44 --- /dev/null +++ b/docs/reference/perform,Canonicalization,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,Chain,Problem-method.html b/docs/reference/perform,Chain,Problem-method.html new file mode 100644 index 00000000..b79652f0 --- /dev/null +++ b/docs/reference/perform,Chain,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,Complex2Real,Problem-method.html b/docs/reference/perform,Complex2Real,Problem-method.html new file mode 100644 index 00000000..15645f58 --- /dev/null +++ b/docs/reference/perform,Complex2Real,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,ConstantSolver,Problem-method.html b/docs/reference/perform,ConstantSolver,Problem-method.html new file mode 100644 index 00000000..563daa80 --- /dev/null +++ b/docs/reference/perform,ConstantSolver,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,CvxAttr2Constr,Problem-method.html b/docs/reference/perform,CvxAttr2Constr,Problem-method.html new file mode 100644 index 00000000..86e93a93 --- /dev/null +++ b/docs/reference/perform,CvxAttr2Constr,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,Dcp2Cone,Problem-method.html b/docs/reference/perform,Dcp2Cone,Problem-method.html new file mode 100644 index 00000000..36a6775f --- /dev/null +++ b/docs/reference/perform,Dcp2Cone,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,Dgp2Dcp,Problem-method.html b/docs/reference/perform,Dgp2Dcp,Problem-method.html new file mode 100644 index 00000000..97140cbd --- /dev/null +++ b/docs/reference/perform,Dgp2Dcp,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,ECOS,Problem-method.html b/docs/reference/perform,ECOS,Problem-method.html new file mode 100644 index 00000000..35ec5a21 --- /dev/null +++ b/docs/reference/perform,ECOS,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,ECOS_BB,Problem-method.html b/docs/reference/perform,ECOS_BB,Problem-method.html new file mode 100644 index 00000000..55db89f5 --- /dev/null +++ b/docs/reference/perform,ECOS_BB,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,EvalParams,Problem-method.html b/docs/reference/perform,EvalParams,Problem-method.html new file mode 100644 index 00000000..2b6d9ea4 --- /dev/null +++ b/docs/reference/perform,EvalParams,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,FlipObjective,Problem-method.html b/docs/reference/perform,FlipObjective,Problem-method.html new file mode 100644 index 00000000..2195cea9 --- /dev/null +++ b/docs/reference/perform,FlipObjective,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,GUROBI_CONIC,Problem-method.html b/docs/reference/perform,GUROBI_CONIC,Problem-method.html new file mode 100644 index 00000000..f4a1f642 --- /dev/null +++ b/docs/reference/perform,GUROBI_CONIC,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,MOSEK,Problem-method.html b/docs/reference/perform,MOSEK,Problem-method.html new file mode 100644 index 00000000..4b67fe4e --- /dev/null +++ b/docs/reference/perform,MOSEK,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,MatrixStuffing,Problem-method.html b/docs/reference/perform,MatrixStuffing,Problem-method.html new file mode 100644 index 00000000..5d19b3c7 --- /dev/null +++ b/docs/reference/perform,MatrixStuffing,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,QpSolver,Problem-method.html b/docs/reference/perform,QpSolver,Problem-method.html new file mode 100644 index 00000000..c0bb6587 --- /dev/null +++ b/docs/reference/perform,QpSolver,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,Reduction,Problem-method.html b/docs/reference/perform,Reduction,Problem-method.html new file mode 100644 index 00000000..7befebea --- /dev/null +++ b/docs/reference/perform,Reduction,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform,SCS,Problem-method.html b/docs/reference/perform,SCS,Problem-method.html new file mode 100644 index 00000000..5e0523ec --- /dev/null +++ b/docs/reference/perform,SCS,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/perform.html b/docs/reference/perform.html index 19df9664..4c09ce55 100644 --- a/docs/reference/perform.html +++ b/docs/reference/perform.html @@ -1,9 +1,9 @@ -Perform Reduction — perform • CVXRPerform Reduction — perform • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Perform Reduction

Arguments

-
object
+ + +
object

A Reduction object.

-
problem
+
problem

A Problem on which the reduction will be performed.

Value

- - -

A list containing

"problem"
+

A list containing

"problem"

A Problem or list representing the equivalent problem.

"inverse_data"
@@ -104,15 +104,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/pf_eigenvalue.html b/docs/reference/pf_eigenvalue.html index 324f758a..cd775344 100644 --- a/docs/reference/pf_eigenvalue.html +++ b/docs/reference/pf_eigenvalue.html @@ -1,9 +1,9 @@ -Perron-Frobenius Eigenvalue — pf_eigenvalue • CVXRPerron-Frobenius Eigenvalue — pf_eigenvalue • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Perron-Frobenius Eigenvalue

Arguments

-
X
+ + +
X

An Expression or positive square matrix.

Value

- - -

An Expression representing the largest eigenvalue of the input.

+

An Expression representing the largest eigenvalue of the input.

Details

@@ -123,15 +123,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/pos.html b/docs/reference/pos.html index 683cddc0..de56e4b0 100644 --- a/docs/reference/pos.html +++ b/docs/reference/pos.html @@ -1,9 +1,9 @@ -Elementwise Positive — pos • CVXRElementwise Positive — pos • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Elementwise Positive

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

Value

- - -

An Expression representing the positive portion of the input.

+

An Expression representing the positive portion of the input.

@@ -104,15 +104,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/power.html b/docs/reference/power.html index 387e6c29..f3ad25ba 100644 --- a/docs/reference/power.html +++ b/docs/reference/power.html @@ -1,164 +1,8 @@ - -Elementwise Power — ^,Expression,numeric-method • CVXR - - -
-
- - - -
-
- - -
-

Raises each element of the input to the power \(p\). -If expr is a CVXR expression, then expr^p is equivalent to power(expr,p).

-
- -
-
# S4 method for Expression,numeric
-^(e1, e2)
-
-power(x, p, max_denom = 1024)
-
- -
-

Arguments

-
e1
-

An Expression object to exponentiate.

- - -
e2
-

The power of the exponential. Must be a numeric scalar.

- - -
x
-

An Expression, vector, or matrix.

- - -
p
-

A scalar value indicating the exponential power.

- - -
max_denom
-

The maximum denominator considered in forming a rational approximation of p.

- -
-
-

Details

-

For \(p = 0\) and \(f(x) = 1\), this function is constant and positive. -For \(p = 1\) and \(f(x) = x\), this function is affine, increasing, and the same sign as \(x\). -For \(p = 2,4,8,\ldots\) and \(f(x) = |x|^p\), this function is convex, positive, with signed monotonicity. -For \(p < 0\) and \(f(x) = \)

\(x^p\)
-

for \(x > 0\)

- -
\(+\infty\)
-

\(x \leq 0\)

- - -

, this function is convex, decreasing, and positive. -For \(0 < p < 1\) and \(f(x) =\)

\(x^p\)
-

for \(x \geq 0\)

- -
\(-\infty\)
-

\(x < 0\)

- - -

, this function is concave, increasing, and positivea. -For \(p > 1, p \neq 2,4,8,\ldots\) and \(f(x) = \)

\(x^p\)
-

for \(x \geq 0\)

- -
\(+\infty\)
-

\(x < 0\)

- - -

, this function is convex, increasing, and positive.

-
- -
-

Examples

-
if (FALSE) {
-x <- Variable()
-prob <- Problem(Minimize(power(x,1.7) + power(x,-2.3) - power(x,0.45)))
-result <- solve(prob)
-result$value
-result$getValue(x)
-}
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/prepend,SolvingChain,Chain-method.html b/docs/reference/prepend,SolvingChain,Chain-method.html new file mode 100644 index 00000000..05c7896c --- /dev/null +++ b/docs/reference/prepend,SolvingChain,Chain-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/problem-parts.html b/docs/reference/problem-parts.html index 79df02bd..e0367290 100644 --- a/docs/reference/problem-parts.html +++ b/docs/reference/problem-parts.html @@ -1,9 +1,9 @@ -Parts of a Problem — problem-parts • CVXRParts of a Problem — problem-parts • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -79,26 +79,24 @@

Parts of a Problem

Arguments

-
object
+ + +
object

A Problem object.

-
value
+
value

The value to assign to the slot.

Value

- - -

For getter functions, the requested slot of the object. +

For getter functions, the requested slot of the object. x <- Variable() prob <- Problem(Minimize(x^2), list(x >= 5)) objective(prob) constraints(prob) size_metrics(prob)

- -

objective(prob) <- Maximize(sqrt(x)) constraints(prob) <- list(x <= 10) objective(prob) @@ -117,15 +115,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/prod.Expression.html b/docs/reference/prod.Expression.html new file mode 100644 index 00000000..b340d14d --- /dev/null +++ b/docs/reference/prod.Expression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/prod.html b/docs/reference/prod.html new file mode 100644 index 00000000..b340d14d --- /dev/null +++ b/docs/reference/prod.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/prod_entries.html b/docs/reference/prod_entries.html index a42cc5d4..12c18795 100644 --- a/docs/reference/prod_entries.html +++ b/docs/reference/prod_entries.html @@ -1,9 +1,9 @@ -Product of Entries — prod_entries • CVXRProduct of Entries — prod_entries • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,33 +68,33 @@

Product of Entries

prod_entries(..., axis = NA_real_, keepdims = FALSE)
 
-# S3 method for Expression
+# S3 method for class 'Expression'
 prod(..., na.rm = FALSE)

Arguments

-
...
+ + +
...

Numeric scalar, vector, matrix, or Expression objects.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
na.rm
+
na.rm

(Unimplemented) A logical value indicating whether missing values should be removed.

Value

- - -

An Expression representing the product of the entries of the input.

+

An Expression representing the product of the entries of the input.

Details

@@ -139,15 +139,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/project,Leaf-method.html b/docs/reference/project,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/project,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/project-methods.html b/docs/reference/project-methods.html index 7dfc3dd8..31b429ef 100644 --- a/docs/reference/project-methods.html +++ b/docs/reference/project-methods.html @@ -1,10 +1,10 @@ Project Value — project-methods • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -75,19 +75,19 @@

Project Value

Arguments

-
object
+ + +
object

A Leaf object.

-
value
+
value

The assigned value.

Value

- - -

The value rounded to the attribute type.

+

The value rounded to the attribute type.

@@ -102,15 +102,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/project.html b/docs/reference/project.html new file mode 100644 index 00000000..7a81f5ad --- /dev/null +++ b/docs/reference/project.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/project_and_assign,Leaf-method.html b/docs/reference/project_and_assign,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/project_and_assign,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/project_and_assign.html b/docs/reference/project_and_assign.html new file mode 100644 index 00000000..7a81f5ad --- /dev/null +++ b/docs/reference/project_and_assign.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/psd_coeff_offset.html b/docs/reference/psd_coeff_offset.html index c5807cfa..42c37fed 100644 --- a/docs/reference/psd_coeff_offset.html +++ b/docs/reference/psd_coeff_offset.html @@ -1,9 +1,9 @@ -Given a problem returns a PSD constraint — psd_coeff_offset • CVXRGiven a problem returns a PSD constraint — psd_coeff_offset • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Given a problem returns a PSD constraint

Arguments

-
problem
+ + +
problem

A Problem object.

-
c
+
c

A vector of coefficients.

Value

- - -

Returns an array G and vector h such that the given constraint is +

Returns an array G and vector h such that the given constraint is equivalent to \(G*z \leq_{PSD} h\).

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/psolve,Problem-method.html b/docs/reference/psolve,Problem-method.html new file mode 100644 index 00000000..2c3e3407 --- /dev/null +++ b/docs/reference/psolve,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/psolve.html b/docs/reference/psolve.html index bec6683b..6b880bcf 100644 --- a/docs/reference/psolve.html +++ b/docs/reference/psolve.html @@ -1,9 +1,9 @@ -Solve a DCP Problem — psolve • CVXRSolve a DCP Problem — psolve • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -81,7 +81,7 @@

Solve a DCP Problem

... ) -# S4 method for Problem +# S4 method for class 'Problem' psolve( object, solver = NA, @@ -97,65 +97,65 @@

Solve a DCP Problem

... ) -# S4 method for Problem,ANY +# S4 method for class 'Problem,ANY' solve(a, b = NA, ...)

Arguments

-
object, a
+ + +
object, a

A Problem object.

-
solver, b
+
solver, b

(Optional) A string indicating the solver to use. Defaults to "ECOS".

-
ignore_dcp
+
ignore_dcp

(Optional) A logical value indicating whether to override the DCP check for a problem.

-
warm_start
+
warm_start

(Optional) A logical value indicating whether the previous solver result should be used to warm start.

-
verbose
+
verbose

(Optional) A logical value indicating whether to print additional solver output.

-
parallel
+
parallel

(Optional) A logical value indicating whether to solve in parallel if the problem is separable.

-
gp
+
gp

(Optional) A logical value indicating whether the problem is a geometric program. Defaults to FALSE.

-
feastol
+
feastol

The feasible tolerance on the primal and dual residual.

-
reltol
+
reltol

The relative tolerance on the duality gap.

-
abstol
+
abstol

The absolute tolerance on the duality gap.

-
num_iter
+
num_iter

The maximum number of iterations.

-
...
+
...

Additional options that will be passed to the specific solver. In general, these options will override any default settings imposed by CVXR.

Value

- - -

A list containing the solution to the problem:

status
+

A list containing the solution to the problem:

status

The status of the solution. Can be "optimal", "optimal_inaccurate", "infeasible", "infeasible_inaccurate", "unbounded", "unbounded_inaccurate", or "solver_error".

value
@@ -209,15 +209,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/quad_form.html b/docs/reference/quad_form.html index dbbabdd3..d78eb04a 100644 --- a/docs/reference/quad_form.html +++ b/docs/reference/quad_form.html @@ -1,9 +1,9 @@ -Quadratic Form — quad_form • CVXRQuadratic Form — quad_form • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Quadratic Form

Arguments

-
x
+ + +
x

An Expression or vector.

-
P
+
P

An Expression or matrix.

Value

- - -

An Expression representing the quadratic form evaluated at the input.

+

An Expression representing the quadratic form evaluated at the input.

@@ -123,15 +123,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/quad_over_lin.html b/docs/reference/quad_over_lin.html index 93943ec1..3c2a0de8 100644 --- a/docs/reference/quad_over_lin.html +++ b/docs/reference/quad_over_lin.html @@ -1,9 +1,9 @@ -Quadratic over Linear — quad_over_lin • CVXRQuadratic over Linear — quad_over_lin • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Quadratic over Linear

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
y
+
y

A scalar Expression or numeric constant.

Value

- - -

An Expression representing the quadratic over linear function value evaluated at the input.

+

An Expression representing the quadratic over linear function value evaluated at the input.

@@ -116,15 +116,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/reduce,Reduction-method.html b/docs/reference/reduce,Reduction-method.html new file mode 100644 index 00000000..7befebea --- /dev/null +++ b/docs/reference/reduce,Reduction-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/reduce.html b/docs/reference/reduce.html index 10b34a0d..8157008f 100644 --- a/docs/reference/reduce.html +++ b/docs/reference/reduce.html @@ -1,9 +1,9 @@ -Reduce a Problem — reduce • CVXRReduce a Problem — reduce • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Reduce a Problem

Arguments

-
object
+ + +
object

A Reduction object.

Value

- - -

An equivalent problem, encoded either as a Problem object or a list.

+

An equivalent problem, encoded either as a Problem object or a list.

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/reduction_format_constr,CLARABEL-method.html b/docs/reference/reduction_format_constr,CLARABEL-method.html new file mode 100644 index 00000000..7b9f7df2 --- /dev/null +++ b/docs/reference/reduction_format_constr,CLARABEL-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/reduction_format_constr,ConicSolver-method.html b/docs/reference/reduction_format_constr,ConicSolver-method.html new file mode 100644 index 00000000..0143e4e5 --- /dev/null +++ b/docs/reference/reduction_format_constr,ConicSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/reduction_format_constr,SCS-method.html b/docs/reference/reduction_format_constr,SCS-method.html new file mode 100644 index 00000000..5e0523ec --- /dev/null +++ b/docs/reference/reduction_format_constr,SCS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/reduction_solve,ConstantSolver,ANY-method.html b/docs/reference/reduction_solve,ConstantSolver,ANY-method.html new file mode 100644 index 00000000..563daa80 --- /dev/null +++ b/docs/reference/reduction_solve,ConstantSolver,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/reduction_solve,ReductionSolver,ANY-method.html b/docs/reference/reduction_solve,ReductionSolver,ANY-method.html new file mode 100644 index 00000000..11a3d8b1 --- /dev/null +++ b/docs/reference/reduction_solve,ReductionSolver,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/reduction_solve,SolvingChain,Problem-method.html b/docs/reference/reduction_solve,SolvingChain,Problem-method.html new file mode 100644 index 00000000..05c7896c --- /dev/null +++ b/docs/reference/reduction_solve,SolvingChain,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/reduction_solve_via_data,SolvingChain-method.html b/docs/reference/reduction_solve_via_data,SolvingChain-method.html new file mode 100644 index 00000000..05c7896c --- /dev/null +++ b/docs/reference/reduction_solve_via_data,SolvingChain-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/remove_from_solver_blacklist.html b/docs/reference/remove_from_solver_blacklist.html new file mode 100644 index 00000000..b80eae26 --- /dev/null +++ b/docs/reference/remove_from_solver_blacklist.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/resetOptions.html b/docs/reference/resetOptions.html index 4017c5ed..c9398cef 100644 --- a/docs/reference/resetOptions.html +++ b/docs/reference/resetOptions.html @@ -1,9 +1,9 @@ -Reset Options — resetOptions • CVXRReset Options — resetOptions • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,16 +71,14 @@

Reset Options

Value

- - -

The default value of CVXR package global .CVXR.options.

+

The default value of CVXR package global .CVXR.options.

Examples

-
if (FALSE) {
+    
if (FALSE) { # \dontrun{
   resetOptions()
-}
+} # }
 
@@ -95,15 +93,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/reshape.html b/docs/reference/reshape.html new file mode 100644 index 00000000..cbc7c98b --- /dev/null +++ b/docs/reference/reshape.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/reshape_expr.html b/docs/reference/reshape_expr.html index 3eb8ca83..4d9b734b 100644 --- a/docs/reference/reshape_expr.html +++ b/docs/reference/reshape_expr.html @@ -1,9 +1,9 @@ -Reshape an Expression — reshape_expr • CVXRReshape an Expression — reshape_expr • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Reshape an Expression

Arguments

-
expr
+ + +
expr

An Expression, vector, or matrix.

-
new_dim
+
new_dim

The new dimensions.

Value

- - -

An Expression representing the reshaped input.

+

An Expression representing the reshaped input.

@@ -170,15 +170,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/residual,Constraint-method.html b/docs/reference/residual,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/residual,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/residual,EqConstraint-method.html b/docs/reference/residual,EqConstraint-method.html new file mode 100644 index 00000000..9ee425a1 --- /dev/null +++ b/docs/reference/residual,EqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/residual,ExpCone-method.html b/docs/reference/residual,ExpCone-method.html new file mode 100644 index 00000000..ec35993c --- /dev/null +++ b/docs/reference/residual,ExpCone-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/residual,IneqConstraint-method.html b/docs/reference/residual,IneqConstraint-method.html new file mode 100644 index 00000000..d750b8f5 --- /dev/null +++ b/docs/reference/residual,IneqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/residual,NonPosConstraint-method.html b/docs/reference/residual,NonPosConstraint-method.html new file mode 100644 index 00000000..687578bd --- /dev/null +++ b/docs/reference/residual,NonPosConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/residual,PSDConstraint-method.html b/docs/reference/residual,PSDConstraint-method.html new file mode 100644 index 00000000..0f746d96 --- /dev/null +++ b/docs/reference/residual,PSDConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/residual,SOC-method.html b/docs/reference/residual,SOC-method.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/residual,SOC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/residual,ZeroConstraint-method.html b/docs/reference/residual,ZeroConstraint-method.html new file mode 100644 index 00000000..10615fe5 --- /dev/null +++ b/docs/reference/residual,ZeroConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/residual-methods.html b/docs/reference/residual-methods.html index 5a66dd08..45a7795a 100644 --- a/docs/reference/residual-methods.html +++ b/docs/reference/residual-methods.html @@ -1,10 +1,10 @@ Constraint Residual — residual-methods • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -75,15 +75,15 @@

Constraint Residual

Arguments

-
object
+ + +
object

A Constraint object.

Value

- - -

A Expression representing the residual, or the value of this expression.

+

A Expression representing the residual, or the value of this expression.

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/residual.html b/docs/reference/residual.html new file mode 100644 index 00000000..99bae7dd --- /dev/null +++ b/docs/reference/residual.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/retrieve,Reduction,Solution-method.html b/docs/reference/retrieve,Reduction,Solution-method.html new file mode 100644 index 00000000..7befebea --- /dev/null +++ b/docs/reference/retrieve,Reduction,Solution-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/retrieve.html b/docs/reference/retrieve.html index 5a38fb53..7885da29 100644 --- a/docs/reference/retrieve.html +++ b/docs/reference/retrieve.html @@ -1,9 +1,9 @@ -Retrieve Solution — retrieve • CVXRRetrieve Solution — retrieve • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Retrieve Solution

Arguments

-
object
+ + +
object

A Reduction object.

-
solution
+
solution

A Solution object.

Value

- - -

A Solution to the problem emitted by reduce.

+

A Solution to the problem emitted by reduce.

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/scaled_lower_tri.html b/docs/reference/scaled_lower_tri.html index 6401e5c5..9806c673 100644 --- a/docs/reference/scaled_lower_tri.html +++ b/docs/reference/scaled_lower_tri.html @@ -1,9 +1,9 @@ -Utility methods for special handling of semidefinite constraints. — scaled_lower_tri • CVXRUtility methods for special handling of semidefinite constraints. — scaled_lower_tri • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Utility methods for special handling of semidefinite constraints.

Arguments

-
matrix
+ + +
matrix

The matrix to get the lower triangular matrix for

Value

- - -

The lower triangular part of the matrix, stacked in column-major order

+

The lower triangular part of the matrix, stacked in column-major order

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/scaled_upper_tri.html b/docs/reference/scaled_upper_tri.html index 9b9c2ad6..d1c24cbf 100644 --- a/docs/reference/scaled_upper_tri.html +++ b/docs/reference/scaled_upper_tri.html @@ -1,9 +1,9 @@ -Utility methods for special handling of semidefinite constraints. — scaled_upper_tri • CVXRUtility methods for special handling of semidefinite constraints. — scaled_upper_tri • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Utility methods for special handling of semidefinite constraints.

Arguments

-
matrix
+ + +
matrix

The matrix to get the upper triangular matrix for

Value

- - -

The upper triangular part of the matrix, stacked in column-major order

+

The upper triangular part of the matrix, stacked in column-major order

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/scalene.html b/docs/reference/scalene.html index 6dfecc4d..8a7f4b86 100644 --- a/docs/reference/scalene.html +++ b/docs/reference/scalene.html @@ -1,10 +1,10 @@ Scalene Function — scalene • CVXR - +
@@ -29,7 +29,7 @@
- +
@@ -73,35 +73,35 @@

Scalene Function

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
alpha
+
alpha

The weight on the positive portion of x.

-
beta
+
beta

The weight on othe negative portion of x.

Value

- - -

An Expression representing the scalene function evaluated at the input.

+

An Expression representing the scalene function evaluated at the input.

Examples

-
if (FALSE) {
+    
if (FALSE) { # \dontrun{
 A <- Variable(2,2)
 val <- cbind(c(-5,2), c(-3,1))
 prob <- Problem(Minimize(scalene(A,2,3)[1,1]), list(A == val))
 result <- solve(prob)
 result$value
 result$getValue(scalene(A, 0.7, 0.3))
-}
+} # }
 
@@ -116,15 +116,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/setIdCounter.html b/docs/reference/setIdCounter.html index b87e060c..082500f2 100644 --- a/docs/reference/setIdCounter.html +++ b/docs/reference/setIdCounter.html @@ -1,9 +1,9 @@ -Set ID Counter — setIdCounter • CVXRSet ID Counter — setIdCounter • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,22 +71,22 @@

Set ID Counter

Arguments

-
value
+ + +
value

The value to assign as ID.

Value

- - -

the changed value of the package global .CVXR.options.

+

the changed value of the package global .CVXR.options.

Examples

-
if (FALSE) {
+    
if (FALSE) { # \dontrun{
   setIdCounter(value = 0L)
-}
+} # }
 
@@ -101,15 +101,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/set_solver_blacklist.html b/docs/reference/set_solver_blacklist.html new file mode 100644 index 00000000..b80eae26 --- /dev/null +++ b/docs/reference/set_solver_blacklist.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/show,Constant-method.html b/docs/reference/show,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/show,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sigma_max.html b/docs/reference/sigma_max.html index 2c66c8d0..81f6fcb2 100644 --- a/docs/reference/sigma_max.html +++ b/docs/reference/sigma_max.html @@ -1,9 +1,9 @@ -Maximum Singular Value — sigma_max • CVXRMaximum Singular Value — sigma_max • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Maximum Singular Value

Arguments

-
A
+ + +
A

An Expression or matrix.

Value

- - -

An Expression representing the maximum singular value.

+

An Expression representing the maximum singular value.

@@ -111,15 +111,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/sign-methods.html b/docs/reference/sign-methods.html index d0fc7e11..c45e6537 100644 --- a/docs/reference/sign-methods.html +++ b/docs/reference/sign-methods.html @@ -1,9 +1,9 @@ -Sign Properties — sign-methods • CVXRSign Properties — sign-methods • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -75,15 +75,15 @@

Sign Properties

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A logical value.

+

A logical value.

@@ -133,15 +133,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/sign.html b/docs/reference/sign.html index c9517491..b55da613 100644 --- a/docs/reference/sign.html +++ b/docs/reference/sign.html @@ -1,9 +1,9 @@ -Sign of Expression — sign,Expression-method • CVXRSign of Expression — sign,Expression-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,21 +66,21 @@

Sign of Expression

-
# S4 method for Expression
+    
# S4 method for class 'Expression'
 sign(x)

Arguments

-
x
+ + +
x

An Expression object.

Value

- - -

A string indicating the sign of the expression, either "ZERO", "NONNEGATIVE", "NONPOSITIVE", or "UNKNOWN".

+

A string indicating the sign of the expression, either "ZERO", "NONNEGATIVE", "NONPOSITIVE", or "UNKNOWN".

@@ -95,15 +95,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/sign_from_args,Abs-method.html b/docs/reference/sign_from_args,Abs-method.html new file mode 100644 index 00000000..6bc6fe74 --- /dev/null +++ b/docs/reference/sign_from_args,Abs-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,AffAtom-method.html b/docs/reference/sign_from_args,AffAtom-method.html new file mode 100644 index 00000000..f0769d4d --- /dev/null +++ b/docs/reference/sign_from_args,AffAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Atom-method.html b/docs/reference/sign_from_args,Atom-method.html new file mode 100644 index 00000000..16d30fc4 --- /dev/null +++ b/docs/reference/sign_from_args,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,BinaryOperator-method.html b/docs/reference/sign_from_args,BinaryOperator-method.html new file mode 100644 index 00000000..0ce00269 --- /dev/null +++ b/docs/reference/sign_from_args,BinaryOperator-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Conv-method.html b/docs/reference/sign_from_args,Conv-method.html new file mode 100644 index 00000000..dcfbf487 --- /dev/null +++ b/docs/reference/sign_from_args,Conv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,CumMax-method.html b/docs/reference/sign_from_args,CumMax-method.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/sign_from_args,CumMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Entr-method.html b/docs/reference/sign_from_args,Entr-method.html new file mode 100644 index 00000000..2d645861 --- /dev/null +++ b/docs/reference/sign_from_args,Entr-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Exp-method.html b/docs/reference/sign_from_args,Exp-method.html new file mode 100644 index 00000000..ddba19b6 --- /dev/null +++ b/docs/reference/sign_from_args,Exp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,EyeMinusInv-method.html b/docs/reference/sign_from_args,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/sign_from_args,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,GeoMean-method.html b/docs/reference/sign_from_args,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/sign_from_args,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Huber-method.html b/docs/reference/sign_from_args,Huber-method.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/sign_from_args,Huber-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,KLDiv-method.html b/docs/reference/sign_from_args,KLDiv-method.html new file mode 100644 index 00000000..fa937a81 --- /dev/null +++ b/docs/reference/sign_from_args,KLDiv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Kron-method.html b/docs/reference/sign_from_args,Kron-method.html new file mode 100644 index 00000000..1b6e7ff6 --- /dev/null +++ b/docs/reference/sign_from_args,Kron-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,LambdaMax-method.html b/docs/reference/sign_from_args,LambdaMax-method.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/sign_from_args,LambdaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Log-method.html b/docs/reference/sign_from_args,Log-method.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/sign_from_args,Log-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Log1p-method.html b/docs/reference/sign_from_args,Log1p-method.html new file mode 100644 index 00000000..5ff748f6 --- /dev/null +++ b/docs/reference/sign_from_args,Log1p-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,LogDet-method.html b/docs/reference/sign_from_args,LogDet-method.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/sign_from_args,LogDet-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,LogSumExp-method.html b/docs/reference/sign_from_args,LogSumExp-method.html new file mode 100644 index 00000000..994650e9 --- /dev/null +++ b/docs/reference/sign_from_args,LogSumExp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Logistic-method.html b/docs/reference/sign_from_args,Logistic-method.html new file mode 100644 index 00000000..cf33b8ec --- /dev/null +++ b/docs/reference/sign_from_args,Logistic-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,MatrixFrac-method.html b/docs/reference/sign_from_args,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/sign_from_args,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,MaxElemwise-method.html b/docs/reference/sign_from_args,MaxElemwise-method.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/sign_from_args,MaxElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,MaxEntries-method.html b/docs/reference/sign_from_args,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/sign_from_args,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,MinElemwise-method.html b/docs/reference/sign_from_args,MinElemwise-method.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/sign_from_args,MinElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,MinEntries-method.html b/docs/reference/sign_from_args,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/sign_from_args,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,NegExpression-method.html b/docs/reference/sign_from_args,NegExpression-method.html new file mode 100644 index 00000000..8f8d2e93 --- /dev/null +++ b/docs/reference/sign_from_args,NegExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Norm1-method.html b/docs/reference/sign_from_args,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/sign_from_args,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,NormInf-method.html b/docs/reference/sign_from_args,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/sign_from_args,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,NormNuc-method.html b/docs/reference/sign_from_args,NormNuc-method.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/sign_from_args,NormNuc-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,OneMinusPos-method.html b/docs/reference/sign_from_args,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/sign_from_args,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,PfEigenvalue-method.html b/docs/reference/sign_from_args,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/sign_from_args,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Pnorm-method.html b/docs/reference/sign_from_args,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/sign_from_args,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,Power-method.html b/docs/reference/sign_from_args,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/sign_from_args,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,ProdEntries-method.html b/docs/reference/sign_from_args,ProdEntries-method.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/sign_from_args,ProdEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,QuadForm-method.html b/docs/reference/sign_from_args,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/sign_from_args,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,QuadOverLin-method.html b/docs/reference/sign_from_args,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/sign_from_args,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,SigmaMax-method.html b/docs/reference/sign_from_args,SigmaMax-method.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/sign_from_args,SigmaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,SumLargest-method.html b/docs/reference/sign_from_args,SumLargest-method.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/sign_from_args,SumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args,SymbolicQuadForm-method.html b/docs/reference/sign_from_args,SymbolicQuadForm-method.html new file mode 100644 index 00000000..29c7d793 --- /dev/null +++ b/docs/reference/sign_from_args,SymbolicQuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sign_from_args.html b/docs/reference/sign_from_args.html index 8ff4d9e0..647ba27b 100644 --- a/docs/reference/sign_from_args.html +++ b/docs/reference/sign_from_args.html @@ -1,9 +1,9 @@ -Atom Sign — sign_from_args • CVXRAtom Sign — sign_from_args • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,21 +68,21 @@

Atom Sign

sign_from_args(object)
 
-# S4 method for Atom
+# S4 method for class 'Atom'
 sign_from_args(object)

Arguments

-
object
+ + +
object

An Atom object.

Value

- - -

A logical vector c(is positive, is negative) indicating the sign of the atom.

+

A logical vector c(is positive, is negative) indicating the sign of the atom.

@@ -97,15 +97,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/size,Constraint-method.html b/docs/reference/size,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/size,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/size,EqConstraint-method.html b/docs/reference/size,EqConstraint-method.html new file mode 100644 index 00000000..9ee425a1 --- /dev/null +++ b/docs/reference/size,EqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/size,ExpCone-method.html b/docs/reference/size,ExpCone-method.html new file mode 100644 index 00000000..ec35993c --- /dev/null +++ b/docs/reference/size,ExpCone-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/size,Expression-method.html b/docs/reference/size,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/size,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/size,IneqConstraint-method.html b/docs/reference/size,IneqConstraint-method.html new file mode 100644 index 00000000..d750b8f5 --- /dev/null +++ b/docs/reference/size,IneqConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/size,ListORExpr-method.html b/docs/reference/size,ListORExpr-method.html new file mode 100644 index 00000000..e2bc1e35 --- /dev/null +++ b/docs/reference/size,ListORExpr-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/size,SOC-method.html b/docs/reference/size,SOC-method.html new file mode 100644 index 00000000..5f942b3f --- /dev/null +++ b/docs/reference/size,SOC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/size,SOCAxis-method.html b/docs/reference/size,SOCAxis-method.html new file mode 100644 index 00000000..07ea6c39 --- /dev/null +++ b/docs/reference/size,SOCAxis-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/size,ZeroConstraint-method.html b/docs/reference/size,ZeroConstraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/size,ZeroConstraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/size-methods.html b/docs/reference/size-methods.html index 74b97635..8cb85329 100644 --- a/docs/reference/size-methods.html +++ b/docs/reference/size-methods.html @@ -1,9 +1,9 @@ -Size Properties — size-methods • CVXRSize Properties — size-methods • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -75,15 +75,15 @@

Size Properties

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A logical value.

+

A logical value.

@@ -128,15 +128,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/size.html b/docs/reference/size.html index bd15d3f9..7310b166 100644 --- a/docs/reference/size.html +++ b/docs/reference/size.html @@ -1,9 +1,9 @@ -Size of Expression — size • CVXRSize of Expression — size • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,21 +68,21 @@

Size of Expression

size(object)
 
-# S4 method for ListORExpr
+# S4 method for class 'ListORExpr'
 size(object)

Arguments

-
object
+ + +
object

An Expression object.

Value

- - -

A vector with two elements c(row, col) representing the dimensions of the expression.

+

A vector with two elements c(row, col) representing the dimensions of the expression.

@@ -115,15 +115,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/size_metrics,Problem-method.html b/docs/reference/size_metrics,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/size_metrics,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/size_metrics.html b/docs/reference/size_metrics.html new file mode 100644 index 00000000..7da59899 --- /dev/null +++ b/docs/reference/size_metrics.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve,Problem,ANY-method.html b/docs/reference/solve,Problem,ANY-method.html new file mode 100644 index 00000000..2c3e3407 --- /dev/null +++ b/docs/reference/solve,Problem,ANY-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve.html b/docs/reference/solve.html new file mode 100644 index 00000000..2c3e3407 --- /dev/null +++ b/docs/reference/solve.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,CBC_CONIC-method.html b/docs/reference/solve_via_data,CBC_CONIC-method.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/solve_via_data,CBC_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,CLARABEL-method.html b/docs/reference/solve_via_data,CLARABEL-method.html new file mode 100644 index 00000000..7b9f7df2 --- /dev/null +++ b/docs/reference/solve_via_data,CLARABEL-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,CPLEX_CONIC-method.html b/docs/reference/solve_via_data,CPLEX_CONIC-method.html new file mode 100644 index 00000000..4665af60 --- /dev/null +++ b/docs/reference/solve_via_data,CPLEX_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,CPLEX_QP-method.html b/docs/reference/solve_via_data,CPLEX_QP-method.html new file mode 100644 index 00000000..a63ea235 --- /dev/null +++ b/docs/reference/solve_via_data,CPLEX_QP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,CVXOPT-method.html b/docs/reference/solve_via_data,CVXOPT-method.html new file mode 100644 index 00000000..8a01311e --- /dev/null +++ b/docs/reference/solve_via_data,CVXOPT-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,ConstantSolver-method.html b/docs/reference/solve_via_data,ConstantSolver-method.html new file mode 100644 index 00000000..563daa80 --- /dev/null +++ b/docs/reference/solve_via_data,ConstantSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,ECOS-method.html b/docs/reference/solve_via_data,ECOS-method.html new file mode 100644 index 00000000..11a3d8b1 --- /dev/null +++ b/docs/reference/solve_via_data,ECOS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,ECOS_BB-method.html b/docs/reference/solve_via_data,ECOS_BB-method.html new file mode 100644 index 00000000..55db89f5 --- /dev/null +++ b/docs/reference/solve_via_data,ECOS_BB-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,GLPK-method.html b/docs/reference/solve_via_data,GLPK-method.html new file mode 100644 index 00000000..b74a96a9 --- /dev/null +++ b/docs/reference/solve_via_data,GLPK-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,GLPK_MI-method.html b/docs/reference/solve_via_data,GLPK_MI-method.html new file mode 100644 index 00000000..b8d9c012 --- /dev/null +++ b/docs/reference/solve_via_data,GLPK_MI-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,GUROBI_CONIC-method.html b/docs/reference/solve_via_data,GUROBI_CONIC-method.html new file mode 100644 index 00000000..f4a1f642 --- /dev/null +++ b/docs/reference/solve_via_data,GUROBI_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,GUROBI_QP-method.html b/docs/reference/solve_via_data,GUROBI_QP-method.html new file mode 100644 index 00000000..de519b9c --- /dev/null +++ b/docs/reference/solve_via_data,GUROBI_QP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,MOSEK-method.html b/docs/reference/solve_via_data,MOSEK-method.html new file mode 100644 index 00000000..4b67fe4e --- /dev/null +++ b/docs/reference/solve_via_data,MOSEK-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,OSQP-method.html b/docs/reference/solve_via_data,OSQP-method.html new file mode 100644 index 00000000..898d17aa --- /dev/null +++ b/docs/reference/solve_via_data,OSQP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,ReductionSolver-method.html b/docs/reference/solve_via_data,ReductionSolver-method.html new file mode 100644 index 00000000..11a3d8b1 --- /dev/null +++ b/docs/reference/solve_via_data,ReductionSolver-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solve_via_data,SCS-method.html b/docs/reference/solve_via_data,SCS-method.html new file mode 100644 index 00000000..5e0523ec --- /dev/null +++ b/docs/reference/solve_via_data,SCS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/solver_stats,Problem-method.html b/docs/reference/solver_stats,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/solver_stats,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sqrt.html b/docs/reference/sqrt.html index a28232e0..1d22e423 100644 --- a/docs/reference/sqrt.html +++ b/docs/reference/sqrt.html @@ -1,9 +1,9 @@ -Square Root — sqrt,Expression-method • CVXRSquare Root — sqrt,Expression-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,21 +66,21 @@

Square Root

-
# S4 method for Expression
+    
# S4 method for class 'Expression'
 sqrt(x)

Arguments

-
x
+ + +
x

An Expression.

Value

- - -

An Expression representing the square root of the input. +

An Expression representing the square root of the input. A <- Variable(2,2) val <- cbind(c(2,4), c(16,1)) prob <- Problem(Maximize(sqrt(A)[1,2]), list(A == val)) @@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/square.html b/docs/reference/square.html index 7ae73536..6d442c88 100644 --- a/docs/reference/square.html +++ b/docs/reference/square.html @@ -1,9 +1,9 @@ -Square — square,Expression-method • CVXRSquare — square,Expression-method • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -66,21 +66,21 @@

Square

-
# S4 method for Expression
+    
# S4 method for class 'Expression'
 square(x)

Arguments

-
x
+ + +
x

An Expression.

Value

- - -

An Expression representing the square of the input. +

An Expression representing the square of the input. A <- Variable(2,2) val <- cbind(c(2,4), c(16,1)) prob <- Problem(Minimize(square(A)[1,2]), list(A == val)) @@ -100,15 +100,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/status,Problem-method.html b/docs/reference/status,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/status,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,CBC_CONIC-method.html b/docs/reference/status_map,CBC_CONIC-method.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/status_map,CBC_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,CLARABEL-method.html b/docs/reference/status_map,CLARABEL-method.html new file mode 100644 index 00000000..7b9f7df2 --- /dev/null +++ b/docs/reference/status_map,CLARABEL-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,CPLEX_CONIC-method.html b/docs/reference/status_map,CPLEX_CONIC-method.html new file mode 100644 index 00000000..4665af60 --- /dev/null +++ b/docs/reference/status_map,CPLEX_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,CPLEX_QP-method.html b/docs/reference/status_map,CPLEX_QP-method.html new file mode 100644 index 00000000..a63ea235 --- /dev/null +++ b/docs/reference/status_map,CPLEX_QP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,CVXOPT-method.html b/docs/reference/status_map,CVXOPT-method.html new file mode 100644 index 00000000..8a01311e --- /dev/null +++ b/docs/reference/status_map,CVXOPT-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,ECOS-method.html b/docs/reference/status_map,ECOS-method.html new file mode 100644 index 00000000..35ec5a21 --- /dev/null +++ b/docs/reference/status_map,ECOS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,GLPK-method.html b/docs/reference/status_map,GLPK-method.html new file mode 100644 index 00000000..b74a96a9 --- /dev/null +++ b/docs/reference/status_map,GLPK-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,GLPK_MI-method.html b/docs/reference/status_map,GLPK_MI-method.html new file mode 100644 index 00000000..b8d9c012 --- /dev/null +++ b/docs/reference/status_map,GLPK_MI-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,GUROBI_CONIC-method.html b/docs/reference/status_map,GUROBI_CONIC-method.html new file mode 100644 index 00000000..f4a1f642 --- /dev/null +++ b/docs/reference/status_map,GUROBI_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,GUROBI_QP-method.html b/docs/reference/status_map,GUROBI_QP-method.html new file mode 100644 index 00000000..de519b9c --- /dev/null +++ b/docs/reference/status_map,GUROBI_QP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,OSQP-method.html b/docs/reference/status_map,OSQP-method.html new file mode 100644 index 00000000..898d17aa --- /dev/null +++ b/docs/reference/status_map,OSQP-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map,SCS-method.html b/docs/reference/status_map,SCS-method.html new file mode 100644 index 00000000..5e0523ec --- /dev/null +++ b/docs/reference/status_map,SCS-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map_lp,CBC_CONIC-method.html b/docs/reference/status_map_lp,CBC_CONIC-method.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/status_map_lp,CBC_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/status_map_mip,CBC_CONIC-method.html b/docs/reference/status_map_mip,CBC_CONIC-method.html new file mode 100644 index 00000000..f1a5a41d --- /dev/null +++ b/docs/reference/status_map_mip,CBC_CONIC-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/stuffed_objective,ConeMatrixStuffing,Problem,CoeffExtractor-method.html b/docs/reference/stuffed_objective,ConeMatrixStuffing,Problem,CoeffExtractor-method.html new file mode 100644 index 00000000..f162fa40 --- /dev/null +++ b/docs/reference/stuffed_objective,ConeMatrixStuffing,Problem,CoeffExtractor-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sum.Expression.html b/docs/reference/sum.Expression.html new file mode 100644 index 00000000..94e2d986 --- /dev/null +++ b/docs/reference/sum.Expression.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sum.html b/docs/reference/sum.html new file mode 100644 index 00000000..94e2d986 --- /dev/null +++ b/docs/reference/sum.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/sum_entries.html b/docs/reference/sum_entries.html index aa586a0d..f458d9fb 100644 --- a/docs/reference/sum_entries.html +++ b/docs/reference/sum_entries.html @@ -1,9 +1,9 @@ -Sum of Entries — sum_entries • CVXRSum of Entries — sum_entries • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -68,37 +68,37 @@

Sum of Entries

sum_entries(expr, axis = NA_real_, keepdims = FALSE)
 
-# S3 method for Expression
+# S3 method for class 'Expression'
 sum(..., na.rm = FALSE)

Arguments

-
expr
+ + +
expr

An Expression, vector, or matrix.

-
axis
+
axis

(Optional) The dimension across which to apply the function: 1 indicates rows, 2 indicates columns, and NA indicates rows and columns. The default is NA.

-
keepdims
+
keepdims

(Optional) Should dimensions be maintained when applying the atom along an axis? If FALSE, result will be collapsed into an \(n x 1\) column vector. The default is FALSE.

-
...
+
...

Numeric scalar, vector, matrix, or Expression objects.

-
na.rm
+
na.rm

(Unimplemented) A logical value indicating whether missing values should be removed.

Value

- - -

An Expression representing the sum of the entries of the input.

+

An Expression representing the sum of the entries of the input.

@@ -157,15 +157,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/sum_largest.html b/docs/reference/sum_largest.html index 2558e39c..ecd7959c 100644 --- a/docs/reference/sum_largest.html +++ b/docs/reference/sum_largest.html @@ -1,9 +1,9 @@ -Sum of Largest Values — sum_largest • CVXRSum of Largest Values — sum_largest • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Sum of Largest Values

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
k
+
k

The number of largest values to sum over.

Value

- - -

An Expression representing the sum of the largest k values of the input.

+

An Expression representing the sum of the largest k values of the input.

@@ -126,15 +126,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/sum_smallest.html b/docs/reference/sum_smallest.html index 78a6539b..02da37bb 100644 --- a/docs/reference/sum_smallest.html +++ b/docs/reference/sum_smallest.html @@ -1,9 +1,9 @@ -Sum of Smallest Values — sum_smallest • CVXRSum of Smallest Values — sum_smallest • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Sum of Smallest Values

Arguments

-
x
+ + +
x

An Expression, vector, or matrix.

-
k
+
k

The number of smallest values to sum over.

Value

- - -

An Expression representing the sum of the smallest k values of the input.

+

An Expression representing the sum of the smallest k values of the input.

@@ -127,15 +127,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/sum_squares.html b/docs/reference/sum_squares.html index a4e87953..8c3936aa 100644 --- a/docs/reference/sum_squares.html +++ b/docs/reference/sum_squares.html @@ -1,9 +1,9 @@ -Sum of Squares — sum_squares • CVXRSum of Squares — sum_squares • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Sum of Squares

Arguments

-
expr
+ + +
expr

An Expression, vector, or matrix.

Value

- - -

An Expression representing the sum of squares of the input.

+

An Expression representing the sum of squares of the input.

@@ -156,15 +156,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/t,Expression-method.html b/docs/reference/t,Expression-method.html new file mode 100644 index 00000000..3af18f80 --- /dev/null +++ b/docs/reference/t,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/t.html b/docs/reference/t.html new file mode 100644 index 00000000..3af18f80 --- /dev/null +++ b/docs/reference/t.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Abs-method.html b/docs/reference/to_numeric,Abs-method.html new file mode 100644 index 00000000..6bc6fe74 --- /dev/null +++ b/docs/reference/to_numeric,Abs-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,AddExpression-method.html b/docs/reference/to_numeric,AddExpression-method.html new file mode 100644 index 00000000..4c3aa2f7 --- /dev/null +++ b/docs/reference/to_numeric,AddExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,BinaryOperator-method.html b/docs/reference/to_numeric,BinaryOperator-method.html new file mode 100644 index 00000000..0ce00269 --- /dev/null +++ b/docs/reference/to_numeric,BinaryOperator-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Conjugate-method.html b/docs/reference/to_numeric,Conjugate-method.html new file mode 100644 index 00000000..2be5e9ec --- /dev/null +++ b/docs/reference/to_numeric,Conjugate-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Conv-method.html b/docs/reference/to_numeric,Conv-method.html new file mode 100644 index 00000000..dcfbf487 --- /dev/null +++ b/docs/reference/to_numeric,Conv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,CumMax-method.html b/docs/reference/to_numeric,CumMax-method.html new file mode 100644 index 00000000..46c15de5 --- /dev/null +++ b/docs/reference/to_numeric,CumMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,CumSum-method.html b/docs/reference/to_numeric,CumSum-method.html new file mode 100644 index 00000000..9d5b0806 --- /dev/null +++ b/docs/reference/to_numeric,CumSum-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,DiagMat-method.html b/docs/reference/to_numeric,DiagMat-method.html new file mode 100644 index 00000000..c7ee6a1c --- /dev/null +++ b/docs/reference/to_numeric,DiagMat-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,DiagVec-method.html b/docs/reference/to_numeric,DiagVec-method.html new file mode 100644 index 00000000..13c5eb42 --- /dev/null +++ b/docs/reference/to_numeric,DiagVec-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,DivExpression-method.html b/docs/reference/to_numeric,DivExpression-method.html new file mode 100644 index 00000000..9d928933 --- /dev/null +++ b/docs/reference/to_numeric,DivExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Entr-method.html b/docs/reference/to_numeric,Entr-method.html new file mode 100644 index 00000000..2d645861 --- /dev/null +++ b/docs/reference/to_numeric,Entr-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Exp-method.html b/docs/reference/to_numeric,Exp-method.html new file mode 100644 index 00000000..ddba19b6 --- /dev/null +++ b/docs/reference/to_numeric,Exp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,EyeMinusInv-method.html b/docs/reference/to_numeric,EyeMinusInv-method.html new file mode 100644 index 00000000..aef5dcf3 --- /dev/null +++ b/docs/reference/to_numeric,EyeMinusInv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,GeoMean-method.html b/docs/reference/to_numeric,GeoMean-method.html new file mode 100644 index 00000000..b90dcd90 --- /dev/null +++ b/docs/reference/to_numeric,GeoMean-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,HStack-method.html b/docs/reference/to_numeric,HStack-method.html new file mode 100644 index 00000000..306a2fec --- /dev/null +++ b/docs/reference/to_numeric,HStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Huber-method.html b/docs/reference/to_numeric,Huber-method.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/to_numeric,Huber-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Imag-method.html b/docs/reference/to_numeric,Imag-method.html new file mode 100644 index 00000000..162e57af --- /dev/null +++ b/docs/reference/to_numeric,Imag-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Index-method.html b/docs/reference/to_numeric,Index-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/to_numeric,Index-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,KLDiv-method.html b/docs/reference/to_numeric,KLDiv-method.html new file mode 100644 index 00000000..fa937a81 --- /dev/null +++ b/docs/reference/to_numeric,KLDiv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Kron-method.html b/docs/reference/to_numeric,Kron-method.html new file mode 100644 index 00000000..1b6e7ff6 --- /dev/null +++ b/docs/reference/to_numeric,Kron-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,LambdaMax-method.html b/docs/reference/to_numeric,LambdaMax-method.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/to_numeric,LambdaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,LambdaSumLargest-method.html b/docs/reference/to_numeric,LambdaSumLargest-method.html new file mode 100644 index 00000000..44111716 --- /dev/null +++ b/docs/reference/to_numeric,LambdaSumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Log-method.html b/docs/reference/to_numeric,Log-method.html new file mode 100644 index 00000000..ab3ead1c --- /dev/null +++ b/docs/reference/to_numeric,Log-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Log1p-method.html b/docs/reference/to_numeric,Log1p-method.html new file mode 100644 index 00000000..5ff748f6 --- /dev/null +++ b/docs/reference/to_numeric,Log1p-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,LogDet-method.html b/docs/reference/to_numeric,LogDet-method.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/to_numeric,LogDet-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,LogSumExp-method.html b/docs/reference/to_numeric,LogSumExp-method.html new file mode 100644 index 00000000..994650e9 --- /dev/null +++ b/docs/reference/to_numeric,LogSumExp-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Logistic-method.html b/docs/reference/to_numeric,Logistic-method.html new file mode 100644 index 00000000..cf33b8ec --- /dev/null +++ b/docs/reference/to_numeric,Logistic-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,MatrixFrac-method.html b/docs/reference/to_numeric,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/to_numeric,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,MaxElemwise-method.html b/docs/reference/to_numeric,MaxElemwise-method.html new file mode 100644 index 00000000..e766afd8 --- /dev/null +++ b/docs/reference/to_numeric,MaxElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,MaxEntries-method.html b/docs/reference/to_numeric,MaxEntries-method.html new file mode 100644 index 00000000..022b6d26 --- /dev/null +++ b/docs/reference/to_numeric,MaxEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,MinElemwise-method.html b/docs/reference/to_numeric,MinElemwise-method.html new file mode 100644 index 00000000..fd174664 --- /dev/null +++ b/docs/reference/to_numeric,MinElemwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,MinEntries-method.html b/docs/reference/to_numeric,MinEntries-method.html new file mode 100644 index 00000000..823985b1 --- /dev/null +++ b/docs/reference/to_numeric,MinEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,MulExpression-method.html b/docs/reference/to_numeric,MulExpression-method.html new file mode 100644 index 00000000..a35c7630 --- /dev/null +++ b/docs/reference/to_numeric,MulExpression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Multiply-method.html b/docs/reference/to_numeric,Multiply-method.html new file mode 100644 index 00000000..99f85b11 --- /dev/null +++ b/docs/reference/to_numeric,Multiply-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Norm1-method.html b/docs/reference/to_numeric,Norm1-method.html new file mode 100644 index 00000000..8e2238d8 --- /dev/null +++ b/docs/reference/to_numeric,Norm1-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,NormInf-method.html b/docs/reference/to_numeric,NormInf-method.html new file mode 100644 index 00000000..7274d806 --- /dev/null +++ b/docs/reference/to_numeric,NormInf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,NormNuc-method.html b/docs/reference/to_numeric,NormNuc-method.html new file mode 100644 index 00000000..28a64d08 --- /dev/null +++ b/docs/reference/to_numeric,NormNuc-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,OneMinusPos-method.html b/docs/reference/to_numeric,OneMinusPos-method.html new file mode 100644 index 00000000..d04df7f0 --- /dev/null +++ b/docs/reference/to_numeric,OneMinusPos-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,PfEigenvalue-method.html b/docs/reference/to_numeric,PfEigenvalue-method.html new file mode 100644 index 00000000..2659a910 --- /dev/null +++ b/docs/reference/to_numeric,PfEigenvalue-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Pnorm-method.html b/docs/reference/to_numeric,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/to_numeric,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Power-method.html b/docs/reference/to_numeric,Power-method.html new file mode 100644 index 00000000..f3ad25ba --- /dev/null +++ b/docs/reference/to_numeric,Power-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,ProdEntries-method.html b/docs/reference/to_numeric,ProdEntries-method.html new file mode 100644 index 00000000..019d4f20 --- /dev/null +++ b/docs/reference/to_numeric,ProdEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Promote-method.html b/docs/reference/to_numeric,Promote-method.html new file mode 100644 index 00000000..3454ffa2 --- /dev/null +++ b/docs/reference/to_numeric,Promote-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,QuadForm-method.html b/docs/reference/to_numeric,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/to_numeric,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,QuadOverLin-method.html b/docs/reference/to_numeric,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/to_numeric,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Real-method.html b/docs/reference/to_numeric,Real-method.html new file mode 100644 index 00000000..80f9cd35 --- /dev/null +++ b/docs/reference/to_numeric,Real-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Reshape-method.html b/docs/reference/to_numeric,Reshape-method.html new file mode 100644 index 00000000..cbc7c98b --- /dev/null +++ b/docs/reference/to_numeric,Reshape-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,SigmaMax-method.html b/docs/reference/to_numeric,SigmaMax-method.html new file mode 100644 index 00000000..96eafb7c --- /dev/null +++ b/docs/reference/to_numeric,SigmaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,SpecialIndex-method.html b/docs/reference/to_numeric,SpecialIndex-method.html new file mode 100644 index 00000000..c221c405 --- /dev/null +++ b/docs/reference/to_numeric,SpecialIndex-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,SumEntries-method.html b/docs/reference/to_numeric,SumEntries-method.html new file mode 100644 index 00000000..4b2e8863 --- /dev/null +++ b/docs/reference/to_numeric,SumEntries-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,SumLargest-method.html b/docs/reference/to_numeric,SumLargest-method.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/to_numeric,SumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Trace-method.html b/docs/reference/to_numeric,Trace-method.html new file mode 100644 index 00000000..4a1e58a1 --- /dev/null +++ b/docs/reference/to_numeric,Trace-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Transpose-method.html b/docs/reference/to_numeric,Transpose-method.html new file mode 100644 index 00000000..6d90f546 --- /dev/null +++ b/docs/reference/to_numeric,Transpose-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,UnaryOperator-method.html b/docs/reference/to_numeric,UnaryOperator-method.html new file mode 100644 index 00000000..67e5d145 --- /dev/null +++ b/docs/reference/to_numeric,UnaryOperator-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,UpperTri-method.html b/docs/reference/to_numeric,UpperTri-method.html new file mode 100644 index 00000000..0d5027f1 --- /dev/null +++ b/docs/reference/to_numeric,UpperTri-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,VStack-method.html b/docs/reference/to_numeric,VStack-method.html new file mode 100644 index 00000000..736da1a4 --- /dev/null +++ b/docs/reference/to_numeric,VStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric,Wrap-method.html b/docs/reference/to_numeric,Wrap-method.html new file mode 100644 index 00000000..e1ae511d --- /dev/null +++ b/docs/reference/to_numeric,Wrap-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/to_numeric.html b/docs/reference/to_numeric.html index 2f0becc2..0820af6e 100644 --- a/docs/reference/to_numeric.html +++ b/docs/reference/to_numeric.html @@ -1,9 +1,9 @@ -Numeric Value of Atom — to_numeric • CVXRNumeric Value of Atom — to_numeric • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Numeric Value of Atom

Arguments

-
object
+ + +
object

An Atom object.

-
values
+
values

A list of arguments to the atom.

Value

- - -

A numeric scalar, vector, or matrix.

+

A numeric scalar, vector, or matrix.

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/total_variation.html b/docs/reference/total_variation.html new file mode 100644 index 00000000..cb584872 --- /dev/null +++ b/docs/reference/total_variation.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/tr.html b/docs/reference/tr.html new file mode 100644 index 00000000..c4f24974 --- /dev/null +++ b/docs/reference/tr.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/trace.html b/docs/reference/trace.html new file mode 100644 index 00000000..4a1e58a1 --- /dev/null +++ b/docs/reference/trace.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/transpose.html b/docs/reference/transpose.html index 5802a886..6d90f546 100644 --- a/docs/reference/transpose.html +++ b/docs/reference/transpose.html @@ -1,119 +1,8 @@ - -Matrix Transpose — t.Expression • CVXR - - -
-
- - - -
-
- - -
-

The transpose of a matrix.

-
- -
-
# S3 method for Expression
-t(x)
-
-# S4 method for Expression
-t(x)
-
- -
-

Arguments

-
x
-

An Expression representing a matrix.

- -
-
-

Value

- - -

An Expression representing the transposed matrix.

-
- -
-

Examples

-
x <- Variable(3, 4)
-t(x)
-#> Transpose(varNA, character(0))
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/reference/tri_to_full.html b/docs/reference/tri_to_full.html index e932dc6f..aac25ab5 100644 --- a/docs/reference/tri_to_full.html +++ b/docs/reference/tri_to_full.html @@ -1,9 +1,9 @@ -Expands lower triangular to full matrix. — tri_to_full • CVXRExpands lower triangular to full matrix. — tri_to_full • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,20 +71,20 @@

Expands lower triangular to full matrix.

Arguments

-
lower_tri
+ + +
lower_tri

A matrix representing the lower triangular part of the matrix, stacked in column-major order

-
n
+
n

The number of rows (columns) in the full square matrix.

Value

- - -

A matrix that is the scaled expansion of the lower triangular matrix.

+

A matrix that is the scaled expansion of the lower triangular matrix.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/triu_to_full.html b/docs/reference/triu_to_full.html index 12dcff7f..3cc1b28b 100644 --- a/docs/reference/triu_to_full.html +++ b/docs/reference/triu_to_full.html @@ -1,9 +1,9 @@ -Expands upper triangular to full matrix. — triu_to_full • CVXRExpands upper triangular to full matrix. — triu_to_full • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,20 +71,20 @@

Expands upper triangular to full matrix.

Arguments

-
upper_tri
+ + +
upper_tri

A matrix representing the uppertriangular part of the matrix, stacked in column-major order

-
n
+
n

The number of rows (columns) in the full square matrix.

Value

- - -

A matrix that is the scaled expansion of the upper triangular matrix.

+

A matrix that is the scaled expansion of the upper triangular matrix.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/tv.html b/docs/reference/tv.html index 955516ff..b2d1914c 100644 --- a/docs/reference/tv.html +++ b/docs/reference/tv.html @@ -1,9 +1,9 @@ -Total Variation — tv • CVXRTotal Variation — tv • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Total Variation

Arguments

-
value
+ + +
value

An Expression, vector, or matrix.

-
...
+
...

(Optional) Expression objects or numeric constants that extend the third dimension of value.

Value

- - -

An Expression representing the total variation of the input.

+

An Expression representing the total variation of the input.

@@ -145,15 +145,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/unpack_results,Problem-method.html b/docs/reference/unpack_results,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/unpack_results,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/unpack_results.html b/docs/reference/unpack_results.html index ca4afac1..8f8478ad 100644 --- a/docs/reference/unpack_results.html +++ b/docs/reference/unpack_results.html @@ -1,9 +1,9 @@ -Parse output from a solver and updates problem state — unpack_results • CVXRParse output from a solver and updates problem state — unpack_results • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,27 +71,27 @@

Parse output from a solver and updates problem state

Arguments

-
object
+ + +
object

A Problem object.

-
solution
+
solution

A Solution object.

-
chain
+
chain

The corresponding solving Chain.

-
inverse_data
+
inverse_data

A InverseData object or list containing data necessary for the inversion.

Value

- - -

A list containing the solution to the problem:

status
+

A list containing the solution to the problem:

status

The status of the solution. Can be "optimal", "optimal_inaccurate", "infeasible", "infeasible_inaccurate", "unbounded", "unbounded_inaccurate", or "solver_error".

value
@@ -120,7 +120,7 @@

Value

Examples

-
if (FALSE) {
+    
if (FALSE) { # \dontrun{
 x <- Variable(2)
 obj <- Minimize(x[1] + cvxr_norm(x, 1))
 constraints <- list(x >= 2)
@@ -154,7 +154,7 @@ 

Examples

res2 <- unpack_results(prob2, "SCS", scs_output) # Without DCP validation (so be sure of your math), above is equivalent to: # res2 <- solve(prob2, solver = "SCS") -} +} # }
@@ -169,15 +169,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/updated_scaled_lower_tri.html b/docs/reference/updated_scaled_lower_tri.html index 5239bd5f..94e018b3 100644 --- a/docs/reference/updated_scaled_lower_tri.html +++ b/docs/reference/updated_scaled_lower_tri.html @@ -1,9 +1,9 @@ -Utility methods for special handling of semidefinite constraints. — updated_scaled_lower_tri • CVXRUtility methods for special handling of semidefinite constraints. — updated_scaled_lower_tri • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Utility methods for special handling of semidefinite constraints.

Arguments

-
matrix
+ + +
matrix

The matrix to get the lower triangular matrix for

Value

- - -

The lower triangular part of the matrix, stacked in column-major order

+

The lower triangular part of the matrix, stacked in column-major order

@@ -94,15 +94,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/upper_tri.html b/docs/reference/upper_tri.html index 665e953a..fdee8c98 100644 --- a/docs/reference/upper_tri.html +++ b/docs/reference/upper_tri.html @@ -1,9 +1,9 @@ -Upper Triangle of a Matrix — upper_tri • CVXRUpper Triangle of a Matrix — upper_tri • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Upper Triangle of a Matrix

Arguments

-
expr
+ + +
expr

An Expression or matrix.

Value

- - -

An Expression representing the upper triangle of the input.

+

An Expression representing the upper triangle of the input.

@@ -106,15 +106,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/validate_args,Atom-method.html b/docs/reference/validate_args,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/validate_args,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,AxisAtom-method.html b/docs/reference/validate_args,AxisAtom-method.html new file mode 100644 index 00000000..276fa9c6 --- /dev/null +++ b/docs/reference/validate_args,AxisAtom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,Conv-method.html b/docs/reference/validate_args,Conv-method.html new file mode 100644 index 00000000..dcfbf487 --- /dev/null +++ b/docs/reference/validate_args,Conv-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,Elementwise-method.html b/docs/reference/validate_args,Elementwise-method.html new file mode 100644 index 00000000..aff69519 --- /dev/null +++ b/docs/reference/validate_args,Elementwise-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,HStack-method.html b/docs/reference/validate_args,HStack-method.html new file mode 100644 index 00000000..306a2fec --- /dev/null +++ b/docs/reference/validate_args,HStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,Huber-method.html b/docs/reference/validate_args,Huber-method.html new file mode 100644 index 00000000..3797edb4 --- /dev/null +++ b/docs/reference/validate_args,Huber-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,Kron-method.html b/docs/reference/validate_args,Kron-method.html new file mode 100644 index 00000000..1b6e7ff6 --- /dev/null +++ b/docs/reference/validate_args,Kron-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,LambdaMax-method.html b/docs/reference/validate_args,LambdaMax-method.html new file mode 100644 index 00000000..2463fdd9 --- /dev/null +++ b/docs/reference/validate_args,LambdaMax-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,LambdaSumLargest-method.html b/docs/reference/validate_args,LambdaSumLargest-method.html new file mode 100644 index 00000000..44111716 --- /dev/null +++ b/docs/reference/validate_args,LambdaSumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,LogDet-method.html b/docs/reference/validate_args,LogDet-method.html new file mode 100644 index 00000000..a03244cc --- /dev/null +++ b/docs/reference/validate_args,LogDet-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,MatrixFrac-method.html b/docs/reference/validate_args,MatrixFrac-method.html new file mode 100644 index 00000000..6009d122 --- /dev/null +++ b/docs/reference/validate_args,MatrixFrac-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,Pnorm-method.html b/docs/reference/validate_args,Pnorm-method.html new file mode 100644 index 00000000..54ce38a4 --- /dev/null +++ b/docs/reference/validate_args,Pnorm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,QuadForm-method.html b/docs/reference/validate_args,QuadForm-method.html new file mode 100644 index 00000000..b35ec2cd --- /dev/null +++ b/docs/reference/validate_args,QuadForm-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,QuadOverLin-method.html b/docs/reference/validate_args,QuadOverLin-method.html new file mode 100644 index 00000000..eddc898a --- /dev/null +++ b/docs/reference/validate_args,QuadOverLin-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,Reshape-method.html b/docs/reference/validate_args,Reshape-method.html new file mode 100644 index 00000000..cbc7c98b --- /dev/null +++ b/docs/reference/validate_args,Reshape-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,SumLargest-method.html b/docs/reference/validate_args,SumLargest-method.html new file mode 100644 index 00000000..abe241bf --- /dev/null +++ b/docs/reference/validate_args,SumLargest-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,Trace-method.html b/docs/reference/validate_args,Trace-method.html new file mode 100644 index 00000000..4a1e58a1 --- /dev/null +++ b/docs/reference/validate_args,Trace-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,UpperTri-method.html b/docs/reference/validate_args,UpperTri-method.html new file mode 100644 index 00000000..0d5027f1 --- /dev/null +++ b/docs/reference/validate_args,UpperTri-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args,VStack-method.html b/docs/reference/validate_args,VStack-method.html new file mode 100644 index 00000000..736da1a4 --- /dev/null +++ b/docs/reference/validate_args,VStack-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_args.html b/docs/reference/validate_args.html index d34d18b7..2da7cba6 100644 --- a/docs/reference/validate_args.html +++ b/docs/reference/validate_args.html @@ -1,9 +1,9 @@ -Validate Arguments — validate_args • CVXRValidate Arguments — validate_args • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,7 +71,9 @@

Validate Arguments

Arguments

-
object
+ + +
object

An Atom object.

@@ -88,15 +90,15 @@

Arguments

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/validate_val,Leaf-method.html b/docs/reference/validate_val,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/validate_val,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/validate_val.html b/docs/reference/validate_val.html index 169672d4..538c9498 100644 --- a/docs/reference/validate_val.html +++ b/docs/reference/validate_val.html @@ -1,9 +1,9 @@ -Validate Value — validate_val • CVXRValidate Value — validate_val • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Validate Value

Arguments

-
object
+ + +
object

A Leaf object.

-
val
+
val

The assigned value.

Value

- - -

The value converted to proper matrix type.

+

The value converted to proper matrix type.

@@ -98,15 +98,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/value,Atom-method.html b/docs/reference/value,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/value,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/value,CallbackParam-method.html b/docs/reference/value,CallbackParam-method.html new file mode 100644 index 00000000..36e5ac84 --- /dev/null +++ b/docs/reference/value,CallbackParam-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/value,Constant-method.html b/docs/reference/value,Constant-method.html new file mode 100644 index 00000000..d28b3fcc --- /dev/null +++ b/docs/reference/value,Constant-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/value,Expression-method.html b/docs/reference/value,Expression-method.html new file mode 100644 index 00000000..d34861cb --- /dev/null +++ b/docs/reference/value,Expression-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/value,Leaf-method.html b/docs/reference/value,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/value,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/value,Objective-method.html b/docs/reference/value,Objective-method.html new file mode 100644 index 00000000..6c63d296 --- /dev/null +++ b/docs/reference/value,Objective-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/value,Parameter-method.html b/docs/reference/value,Parameter-method.html new file mode 100644 index 00000000..2f7668bf --- /dev/null +++ b/docs/reference/value,Parameter-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/value,Problem-method.html b/docs/reference/value,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/value,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/value,Variable-method.html b/docs/reference/value,Variable-method.html new file mode 100644 index 00000000..32eadf30 --- /dev/null +++ b/docs/reference/value,Variable-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/value-methods.html b/docs/reference/value-methods.html index 8d47fcf7..7c650d17 100644 --- a/docs/reference/value-methods.html +++ b/docs/reference/value-methods.html @@ -1,9 +1,9 @@ -Get or Set Value — value-methods • CVXRGet or Set Value — value-methods • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -73,19 +73,19 @@

Get or Set Value

Arguments

-
object
+ + +
object

A Variable, Parameter, Expression, or Problem object.

-
value
+
value

A numeric scalar, vector, or matrix to assign to the object.

Value

- - -

The numeric value of the variable, parameter, or expression. If any part of the mathematical object is unknown, return NA.

+

The numeric value of the variable, parameter, or expression. If any part of the mathematical object is unknown, return NA.

@@ -112,15 +112,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/value.html b/docs/reference/value.html new file mode 100644 index 00000000..b821322e --- /dev/null +++ b/docs/reference/value.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/value_impl,Atom-method.html b/docs/reference/value_impl,Atom-method.html new file mode 100644 index 00000000..b0939ca8 --- /dev/null +++ b/docs/reference/value_impl,Atom-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/variables,Canonical-method.html b/docs/reference/variables,Canonical-method.html new file mode 100644 index 00000000..92de4b10 --- /dev/null +++ b/docs/reference/variables,Canonical-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/variables,Leaf-method.html b/docs/reference/variables,Leaf-method.html new file mode 100644 index 00000000..a04a8766 --- /dev/null +++ b/docs/reference/variables,Leaf-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/variables,Problem-method.html b/docs/reference/variables,Problem-method.html new file mode 100644 index 00000000..ab75fb7f --- /dev/null +++ b/docs/reference/variables,Problem-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/variables,Variable-method.html b/docs/reference/variables,Variable-method.html new file mode 100644 index 00000000..32eadf30 --- /dev/null +++ b/docs/reference/variables,Variable-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/variables.html b/docs/reference/variables.html new file mode 100644 index 00000000..d9cc208a --- /dev/null +++ b/docs/reference/variables.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/vec.html b/docs/reference/vec.html index 9b4902da..74d8d6d3 100644 --- a/docs/reference/vec.html +++ b/docs/reference/vec.html @@ -1,9 +1,9 @@ -Vectorization of a Matrix — vec • CVXRVectorization of a Matrix — vec • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,15 +71,15 @@

Vectorization of a Matrix

Arguments

-
X
+ + +
X

An Expression or matrix.

Value

- - -

An Expression representing the vectorized matrix.

+

An Expression representing the vectorized matrix.

@@ -113,15 +113,15 @@

Examples

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/vectorized_lower_tri_to_mat.html b/docs/reference/vectorized_lower_tri_to_mat.html index c4d72dd5..5aeb79ce 100644 --- a/docs/reference/vectorized_lower_tri_to_mat.html +++ b/docs/reference/vectorized_lower_tri_to_mat.html @@ -1,9 +1,9 @@ -Turns symmetric 2D array into a lower triangular matrix — vectorized_lower_tri_to_mat • CVXRTurns symmetric 2D array into a lower triangular matrix — vectorized_lower_tri_to_mat • CVXR - +
@@ -28,7 +28,7 @@
- +
@@ -71,19 +71,19 @@

Turns symmetric 2D array into a lower triangular matrix

Arguments

-
v
+ + +
v

A list of length (dim * (dim + 1) / 2).

-
dim
+
dim

The number of rows (equivalently, columns) in the output array.

Value

- - -

Return the symmetric 2D array defined by taking "v" to specify its +

Return the symmetric 2D array defined by taking "v" to specify its lower triangular matrix.

@@ -99,15 +99,15 @@

Value

-

Site built with pkgdown 2.0.9.

+

Site built with pkgdown 2.1.1.

- - + + diff --git a/docs/reference/violation,Constraint-method.html b/docs/reference/violation,Constraint-method.html new file mode 100644 index 00000000..eb613b29 --- /dev/null +++ b/docs/reference/violation,Constraint-method.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/violation.html b/docs/reference/violation.html new file mode 100644 index 00000000..99bae7dd --- /dev/null +++ b/docs/reference/violation.html @@ -0,0 +1,8 @@ + + + + + + + + diff --git a/docs/reference/vstack.html b/docs/reference/vstack.html index 5e531df1..736da1a4 100644 --- a/docs/reference/vstack.html +++ b/docs/reference/vstack.html @@ -1,140 +1,8 @@ - -Vertical Concatenation — vstack • CVXR - - -
-
- - - -
-
- - -
-

The vertical concatenation of expressions. This is equivalent to rbind when applied to objects with the same number of columns.

-
- -
-
vstack(...)
-
- -
-

Arguments

-
...
-

Expression objects, vectors, or matrices. All arguments must have the same number of columns.

- -
-
-

Value

- - -

An Expression representing the concatenated inputs.

-
- -
-

Examples

-
x <- Variable(2)
-y <- Variable(3)
-c <- matrix(1, nrow = 1, ncol = 5)
-prob <- Problem(Minimize(c %*% vstack(x, y)), list(x == c(1,2), y == c(3,4,5)))
-result <- solve(prob)
-result$value
-#> [1] 15
-
-c <- matrix(1, nrow = 1, ncol = 4)
-prob <- Problem(Minimize(c %*% vstack(x, x)), list(x == c(1,2)))
-result <- solve(prob)
-result$value
-#> [1] 6
-
-A <- Variable(2,2)
-C <- Variable(3,2)
-c <- matrix(1, nrow = 2, ncol = 2)
-prob <- Problem(Minimize(sum(vstack(A, C))), list(A >= 2*c, C == -2))
-result <- solve(prob)
-result$value
-#> [1] -4
-
-B <- Variable(2,2)
-c <- matrix(1, nrow = 1, ncol = 2)
-prob <- Problem(Minimize(sum(vstack(c %*% A, c %*% B))), list(A >= 2, B == -2))
-result <- solve(prob)
-result$value
-#> [1] 0
-
-
-
- -
- - -
- - - - - - - + + + + + + + diff --git a/docs/sitemap.xml b/docs/sitemap.xml index 4760f57b..9a445b00 100644 --- a/docs/sitemap.xml +++ b/docs/sitemap.xml @@ -1,1260 +1,422 @@ - - - - https://www.cvxgrp.org/CVXR/404.html - - - https://www.cvxgrp.org/CVXR/LICENSE-text.html - - - https://www.cvxgrp.org/CVXR/articles/cvxr_intro.html - - - https://www.cvxgrp.org/CVXR/articles/index.html - - - https://www.cvxgrp.org/CVXR/articles/version1.html - - - https://www.cvxgrp.org/CVXR/authors.html - - - https://www.cvxgrp.org/CVXR/index.html - - - https://www.cvxgrp.org/CVXR/news/index.html - - - https://www.cvxgrp.org/CVXR/reference/Abs-class.html - - - https://www.cvxgrp.org/CVXR/reference/AddExpression-class.html - - - https://www.cvxgrp.org/CVXR/reference/AffAtom-class.html - - - https://www.cvxgrp.org/CVXR/reference/Atom-class.html - - - https://www.cvxgrp.org/CVXR/reference/AxisAtom-class.html - - - https://www.cvxgrp.org/CVXR/reference/BinaryOperator-class.html - - - https://www.cvxgrp.org/CVXR/reference/CBC_CONIC-class.html - - - https://www.cvxgrp.org/CVXR/reference/CLARABEL-class.html - - - https://www.cvxgrp.org/CVXR/reference/CLARABEL.dims_to_solver_dict.html - - - https://www.cvxgrp.org/CVXR/reference/CLARABEL.extract_dual_value.html - - - https://www.cvxgrp.org/CVXR/reference/CPLEX_CONIC-class.html - - - https://www.cvxgrp.org/CVXR/reference/CPLEX_QP-class.html - - - https://www.cvxgrp.org/CVXR/reference/CVXOPT-class.html - - - https://www.cvxgrp.org/CVXR/reference/CVXR-package.html - - - https://www.cvxgrp.org/CVXR/reference/CallbackParam-class.html - - - https://www.cvxgrp.org/CVXR/reference/Canonical-class.html - - - https://www.cvxgrp.org/CVXR/reference/Canonicalization-class.html - - - https://www.cvxgrp.org/CVXR/reference/Chain-class.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real-class.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.abs_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.add.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.at_least_2D.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.binary_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.canonicalize_expr.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.canonicalize_tree.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.conj_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.constant_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.hermitian_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.imag_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.join.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.lambda_sum_largest_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.matrix_frac_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.nonpos_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.norm_nuc_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.param_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.pnorm_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.psd_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.quad_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.quad_over_lin_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.real_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.separable_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.soc_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.variable_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Complex2Real.zero_canon.html - - - https://www.cvxgrp.org/CVXR/reference/ConeDims-class.html - - - https://www.cvxgrp.org/CVXR/reference/ConeMatrixStuffing-class.html - - - https://www.cvxgrp.org/CVXR/reference/ConicSolver-class.html - - - https://www.cvxgrp.org/CVXR/reference/ConicSolver.get_coeff_offset.html - - - https://www.cvxgrp.org/CVXR/reference/ConicSolver.get_spacing_matrix.html - - - https://www.cvxgrp.org/CVXR/reference/Conjugate-class.html - - - https://www.cvxgrp.org/CVXR/reference/Constant-class.html - - - https://www.cvxgrp.org/CVXR/reference/ConstantSolver-class.html - - - https://www.cvxgrp.org/CVXR/reference/Constraint-class.html - - - https://www.cvxgrp.org/CVXR/reference/Conv-class.html - - - https://www.cvxgrp.org/CVXR/reference/CumMax-class.html - - - https://www.cvxgrp.org/CVXR/reference/CumSum-class.html - - - https://www.cvxgrp.org/CVXR/reference/CvxAttr2Constr-class.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone-class.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.entr_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.exp_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.geo_mean_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.huber_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.indicator_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.kl_div_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.lambda_max_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.lambda_sum_largest_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.log1p_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.log_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.log_det_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.log_sum_exp_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.logistic_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.matrix_frac_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.normNuc_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.pnorm_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.power_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.quad_form_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.quad_over_lin_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.sigma_max_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp-class.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.add_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.constant_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.div_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.exp_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.eye_minus_inv_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.geo_mean_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.log_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.mul_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.mulexpression_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.nonpos_constr_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.norm1_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.norm_inf_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.one_minus_pos_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.parameter_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.pf_eigenvalue_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.pnorm_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.power_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.prod_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.quad_form_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.quad_over_lin_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.sum_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.trace_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.zero_constr_canon.html - - - https://www.cvxgrp.org/CVXR/reference/DgpCanonMethods-class.html - - - https://www.cvxgrp.org/CVXR/reference/Diag-int.html - - - https://www.cvxgrp.org/CVXR/reference/DiagMat-class.html - - - https://www.cvxgrp.org/CVXR/reference/DiagVec-class.html - - - https://www.cvxgrp.org/CVXR/reference/Diff-int.html - - - https://www.cvxgrp.org/CVXR/reference/DiffPos.html - - - https://www.cvxgrp.org/CVXR/reference/DivExpression-class.html - - - https://www.cvxgrp.org/CVXR/reference/ECOS-class.html - - - https://www.cvxgrp.org/CVXR/reference/ECOS.dims_to_solver_dict.html - - - https://www.cvxgrp.org/CVXR/reference/ECOS_BB-class.html - - - https://www.cvxgrp.org/CVXR/reference/Elementwise-class.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl-class.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl.abs_canon.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl.cummax_canon.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl.cumsum_canon.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl.max_elemwise_canon.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl.max_entries_canon.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl.min_elemwise_canon.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl.min_entries_canon.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl.norm1_canon.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl.norm_inf_canon.html - - - https://www.cvxgrp.org/CVXR/reference/EliminatePwl.sum_largest_canon.html - - - https://www.cvxgrp.org/CVXR/reference/Entr-class.html - - - https://www.cvxgrp.org/CVXR/reference/EqConstraint-class.html - - - https://www.cvxgrp.org/CVXR/reference/EvalParams-class.html - - - https://www.cvxgrp.org/CVXR/reference/Exp-class.html - - - https://www.cvxgrp.org/CVXR/reference/ExpCone-class.html - - - https://www.cvxgrp.org/CVXR/reference/Expression-class.html - - - https://www.cvxgrp.org/CVXR/reference/EyeMinusInv-class.html - - - https://www.cvxgrp.org/CVXR/reference/FlipObjective-class.html - - - https://www.cvxgrp.org/CVXR/reference/GLPK-class.html - - - https://www.cvxgrp.org/CVXR/reference/GLPK_MI-class.html - - - https://www.cvxgrp.org/CVXR/reference/GUROBI_CONIC-class.html - - - https://www.cvxgrp.org/CVXR/reference/GUROBI_QP-class.html - - - https://www.cvxgrp.org/CVXR/reference/GeoMean-class.html - - - https://www.cvxgrp.org/CVXR/reference/HStack-class.html - - - https://www.cvxgrp.org/CVXR/reference/HarmonicMean.html - - - https://www.cvxgrp.org/CVXR/reference/Huber-class.html - - - https://www.cvxgrp.org/CVXR/reference/Imag-class.html - - - https://www.cvxgrp.org/CVXR/reference/Index-class.html - - - https://www.cvxgrp.org/CVXR/reference/IneqConstraint-class.html - - - https://www.cvxgrp.org/CVXR/reference/InverseData-class.html - - - https://www.cvxgrp.org/CVXR/reference/KLDiv-class.html - - - https://www.cvxgrp.org/CVXR/reference/Kron-class.html - - - https://www.cvxgrp.org/CVXR/reference/LambdaMax-class.html - - - https://www.cvxgrp.org/CVXR/reference/LambdaMin.html - - - https://www.cvxgrp.org/CVXR/reference/LambdaSumLargest-class.html - - - https://www.cvxgrp.org/CVXR/reference/LambdaSumSmallest.html - - - https://www.cvxgrp.org/CVXR/reference/Leaf-class.html - - - https://www.cvxgrp.org/CVXR/reference/ListORConstr-class.html - - - https://www.cvxgrp.org/CVXR/reference/Log-class.html - - - https://www.cvxgrp.org/CVXR/reference/Log1p-class.html - - - https://www.cvxgrp.org/CVXR/reference/LogDet-class.html - - - https://www.cvxgrp.org/CVXR/reference/LogSumExp-class.html - - - https://www.cvxgrp.org/CVXR/reference/Logistic-class.html - - - https://www.cvxgrp.org/CVXR/reference/MOSEK-class.html - - - https://www.cvxgrp.org/CVXR/reference/MOSEK.parse_dual_vars.html - - - https://www.cvxgrp.org/CVXR/reference/MOSEK.recover_dual_variables.html - - - https://www.cvxgrp.org/CVXR/reference/MatrixFrac-class.html - - - https://www.cvxgrp.org/CVXR/reference/MatrixStuffing-class.html - - - https://www.cvxgrp.org/CVXR/reference/MaxElemwise-class.html - - - https://www.cvxgrp.org/CVXR/reference/MaxEntries-class.html - - - https://www.cvxgrp.org/CVXR/reference/Maximize-class.html - - - https://www.cvxgrp.org/CVXR/reference/MinElemwise-class.html - - - https://www.cvxgrp.org/CVXR/reference/MinEntries-class.html - - - https://www.cvxgrp.org/CVXR/reference/Minimize-class.html - - - https://www.cvxgrp.org/CVXR/reference/MixedNorm.html - - - https://www.cvxgrp.org/CVXR/reference/MulExpression-class.html - - - https://www.cvxgrp.org/CVXR/reference/Multiply-class.html - - - https://www.cvxgrp.org/CVXR/reference/Neg-int.html - - - https://www.cvxgrp.org/CVXR/reference/NegExpression-class.html - - - https://www.cvxgrp.org/CVXR/reference/NonPosConstraint-class.html - - - https://www.cvxgrp.org/CVXR/reference/NonlinearConstraint-class.html - - - https://www.cvxgrp.org/CVXR/reference/Norm-atom.html - - - https://www.cvxgrp.org/CVXR/reference/Norm1-class.html - - - https://www.cvxgrp.org/CVXR/reference/Norm2-atom.html - - - https://www.cvxgrp.org/CVXR/reference/NormInf-class.html - - - https://www.cvxgrp.org/CVXR/reference/NormNuc-class.html - - - https://www.cvxgrp.org/CVXR/reference/OSQP-class.html - - - https://www.cvxgrp.org/CVXR/reference/Objective-arith.html - - - https://www.cvxgrp.org/CVXR/reference/Objective-class.html - - - https://www.cvxgrp.org/CVXR/reference/OneMinusPos-class.html - - - https://www.cvxgrp.org/CVXR/reference/PSDConstraint-class.html - - - https://www.cvxgrp.org/CVXR/reference/PSDWrap-class.html - - - https://www.cvxgrp.org/CVXR/reference/Parameter-class.html - - - https://www.cvxgrp.org/CVXR/reference/PfEigenvalue-class.html - - - https://www.cvxgrp.org/CVXR/reference/Pnorm-class.html - - - https://www.cvxgrp.org/CVXR/reference/Pos-int.html - - - https://www.cvxgrp.org/CVXR/reference/Power-class.html - - - https://www.cvxgrp.org/CVXR/reference/Problem-arith.html - - - https://www.cvxgrp.org/CVXR/reference/Problem-class.html - - - https://www.cvxgrp.org/CVXR/reference/ProdEntries-class.html - - - https://www.cvxgrp.org/CVXR/reference/Promote-class.html - - - https://www.cvxgrp.org/CVXR/reference/Qp2SymbolicQp-class.html - - - https://www.cvxgrp.org/CVXR/reference/QpMatrixStuffing-class.html - - - https://www.cvxgrp.org/CVXR/reference/QpSolver-class.html - - - https://www.cvxgrp.org/CVXR/reference/QuadForm-class.html - - - https://www.cvxgrp.org/CVXR/reference/QuadOverLin-class.html - - - https://www.cvxgrp.org/CVXR/reference/Rdict-class.html - - - https://www.cvxgrp.org/CVXR/reference/Rdictdefault-class.html - - - https://www.cvxgrp.org/CVXR/reference/Real-class.html - - - https://www.cvxgrp.org/CVXR/reference/Reduction-class.html - - - https://www.cvxgrp.org/CVXR/reference/ReductionSolver-class.html - - - https://www.cvxgrp.org/CVXR/reference/Reshape-class.html - - - https://www.cvxgrp.org/CVXR/reference/SCS-class.html - - - https://www.cvxgrp.org/CVXR/reference/SCS.dims_to_solver_dict.html - - - https://www.cvxgrp.org/CVXR/reference/SCS.extract_dual_value.html - - - https://www.cvxgrp.org/CVXR/reference/SOC-class.html - - - https://www.cvxgrp.org/CVXR/reference/SOCAxis-class.html - - - https://www.cvxgrp.org/CVXR/reference/SigmaMax-class.html - - - https://www.cvxgrp.org/CVXR/reference/SizeMetrics-class.html - - - https://www.cvxgrp.org/CVXR/reference/Solution-class.html - - - https://www.cvxgrp.org/CVXR/reference/SolverStats-class.html - - - https://www.cvxgrp.org/CVXR/reference/SolvingChain-class.html - - - https://www.cvxgrp.org/CVXR/reference/SpecialIndex-class.html - - - https://www.cvxgrp.org/CVXR/reference/SumEntries-class.html - - - https://www.cvxgrp.org/CVXR/reference/SumLargest-class.html - - - https://www.cvxgrp.org/CVXR/reference/SumSmallest.html - - - https://www.cvxgrp.org/CVXR/reference/SumSquares.html - - - https://www.cvxgrp.org/CVXR/reference/SymbolicQuadForm-class.html - - - https://www.cvxgrp.org/CVXR/reference/TotalVariation.html - - - https://www.cvxgrp.org/CVXR/reference/Trace-class.html - - - https://www.cvxgrp.org/CVXR/reference/Transpose-class.html - - - https://www.cvxgrp.org/CVXR/reference/UnaryOperator-class.html - - - https://www.cvxgrp.org/CVXR/reference/UpperTri-class.html - - - https://www.cvxgrp.org/CVXR/reference/VStack-class.html - - - https://www.cvxgrp.org/CVXR/reference/Variable-class.html - - - https://www.cvxgrp.org/CVXR/reference/Wrap-class.html - - - https://www.cvxgrp.org/CVXR/reference/ZeroConstraint-class.html - - - https://www.cvxgrp.org/CVXR/reference/abs.html - - - https://www.cvxgrp.org/CVXR/reference/accepts.html - - - https://www.cvxgrp.org/CVXR/reference/are_args_affine.html - - - https://www.cvxgrp.org/CVXR/reference/bmat.html - - - https://www.cvxgrp.org/CVXR/reference/canonicalize.html - - - https://www.cvxgrp.org/CVXR/reference/cdiac.html - - - https://www.cvxgrp.org/CVXR/reference/complex-atoms.html - - - https://www.cvxgrp.org/CVXR/reference/complex-methods.html - - - https://www.cvxgrp.org/CVXR/reference/cone-methods.html - - - https://www.cvxgrp.org/CVXR/reference/constr_value.html - - - https://www.cvxgrp.org/CVXR/reference/construct_intermediate_chain-Problem-list-method.html - - - https://www.cvxgrp.org/CVXR/reference/construct_solving_chain.html - - - https://www.cvxgrp.org/CVXR/reference/conv.html - - - https://www.cvxgrp.org/CVXR/reference/cummax_axis.html - - - https://www.cvxgrp.org/CVXR/reference/cumsum_axis.html - - - https://www.cvxgrp.org/CVXR/reference/curvature-atom.html - - - https://www.cvxgrp.org/CVXR/reference/curvature-comp.html - - - https://www.cvxgrp.org/CVXR/reference/curvature-methods.html - - - https://www.cvxgrp.org/CVXR/reference/curvature.html - - - https://www.cvxgrp.org/CVXR/reference/cvxr_norm.html - - - https://www.cvxgrp.org/CVXR/reference/diag.html - - - https://www.cvxgrp.org/CVXR/reference/diff.html - - - https://www.cvxgrp.org/CVXR/reference/dim_from_args.html - - - https://www.cvxgrp.org/CVXR/reference/domain.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOpVector__new.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOpVector__push_back.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__args_push_back.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_dense_data.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_id.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_size.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_slice.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_sparse.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_sparse_data.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_type.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__new.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_dense_data.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_size.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_slice.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_sparse.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_sparse_data.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_type.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__size_push_back.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp__slice_push_back.html - - - https://www.cvxgrp.org/CVXR/reference/dot-LinOp_at_index.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_I.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_J.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_V.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_const_to_row.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_const_vec.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_id_to_col.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__new.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_I.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_J.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_V.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_const_to_row.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_const_vec.html - - - https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_id_to_col.html - - - https://www.cvxgrp.org/CVXR/reference/dot-build_matrix_0.html - - - https://www.cvxgrp.org/CVXR/reference/dot-build_matrix_1.html - - - https://www.cvxgrp.org/CVXR/reference/dot-decomp_quad.html - - - https://www.cvxgrp.org/CVXR/reference/dot-p_norm.html - - - https://www.cvxgrp.org/CVXR/reference/dspop.html - - - https://www.cvxgrp.org/CVXR/reference/dssamp.html - - - https://www.cvxgrp.org/CVXR/reference/dual_value-methods.html - - - https://www.cvxgrp.org/CVXR/reference/entr.html - - - https://www.cvxgrp.org/CVXR/reference/exp.html - - - https://www.cvxgrp.org/CVXR/reference/expression-parts.html - - - https://www.cvxgrp.org/CVXR/reference/extract_dual_value.html - - - https://www.cvxgrp.org/CVXR/reference/extract_mip_idx.html - - - https://www.cvxgrp.org/CVXR/reference/eye_minus_inv.html - - - https://www.cvxgrp.org/CVXR/reference/format_constr.html - - - https://www.cvxgrp.org/CVXR/reference/geo_mean.html - - - https://www.cvxgrp.org/CVXR/reference/get_data.html - - - https://www.cvxgrp.org/CVXR/reference/get_dual_values.html - - - https://www.cvxgrp.org/CVXR/reference/get_id.html - - - https://www.cvxgrp.org/CVXR/reference/get_np.html - - - https://www.cvxgrp.org/CVXR/reference/get_problem_data.html - - - https://www.cvxgrp.org/CVXR/reference/get_sp.html - - - https://www.cvxgrp.org/CVXR/reference/grad.html - - - https://www.cvxgrp.org/CVXR/reference/graph_implementation.html - - - https://www.cvxgrp.org/CVXR/reference/group_constraints.html - - - https://www.cvxgrp.org/CVXR/reference/harmonic_mean.html - - - https://www.cvxgrp.org/CVXR/reference/hstack.html - - - https://www.cvxgrp.org/CVXR/reference/huber.html - - - https://www.cvxgrp.org/CVXR/reference/id.html - - - https://www.cvxgrp.org/CVXR/reference/import_solver.html - - - https://www.cvxgrp.org/CVXR/reference/index.html - - - https://www.cvxgrp.org/CVXR/reference/installed_solvers.html - - - https://www.cvxgrp.org/CVXR/reference/inv_pos.html - - - https://www.cvxgrp.org/CVXR/reference/invert.html - - - https://www.cvxgrp.org/CVXR/reference/is_dcp.html - - - https://www.cvxgrp.org/CVXR/reference/is_dgp.html - - - https://www.cvxgrp.org/CVXR/reference/is_mixed_integer.html - - - https://www.cvxgrp.org/CVXR/reference/is_qp.html - - - https://www.cvxgrp.org/CVXR/reference/is_stuffed_cone_constraint.html - - - https://www.cvxgrp.org/CVXR/reference/is_stuffed_cone_objective.html - - - https://www.cvxgrp.org/CVXR/reference/is_stuffed_qp_objective.html - - - https://www.cvxgrp.org/CVXR/reference/kl_div.html - - - https://www.cvxgrp.org/CVXR/reference/kronecker.html - - - https://www.cvxgrp.org/CVXR/reference/lambda_max.html - - - https://www.cvxgrp.org/CVXR/reference/lambda_min.html - - - https://www.cvxgrp.org/CVXR/reference/lambda_sum_largest.html - - - https://www.cvxgrp.org/CVXR/reference/lambda_sum_smallest.html - - - https://www.cvxgrp.org/CVXR/reference/leaf-attr.html - - - https://www.cvxgrp.org/CVXR/reference/linearize.html - - - https://www.cvxgrp.org/CVXR/reference/log.html - - - https://www.cvxgrp.org/CVXR/reference/log_det.html - - - https://www.cvxgrp.org/CVXR/reference/log_log_curvature-atom.html - - - https://www.cvxgrp.org/CVXR/reference/log_log_curvature-methods.html - - - https://www.cvxgrp.org/CVXR/reference/log_log_curvature.html - - - https://www.cvxgrp.org/CVXR/reference/log_sum_exp.html - - - https://www.cvxgrp.org/CVXR/reference/logistic.html - - - https://www.cvxgrp.org/CVXR/reference/make_sparse_diagonal_matrix.html - - - https://www.cvxgrp.org/CVXR/reference/matrix_frac.html - - - https://www.cvxgrp.org/CVXR/reference/matrix_prop-methods.html - - - https://www.cvxgrp.org/CVXR/reference/matrix_trace.html - - - https://www.cvxgrp.org/CVXR/reference/max_elemwise.html - - - https://www.cvxgrp.org/CVXR/reference/max_entries.html - - - https://www.cvxgrp.org/CVXR/reference/mean.html - - - https://www.cvxgrp.org/CVXR/reference/min_elemwise.html - - - https://www.cvxgrp.org/CVXR/reference/min_entries.html - - - https://www.cvxgrp.org/CVXR/reference/mip_capable.html - - - https://www.cvxgrp.org/CVXR/reference/mixed_norm.html - - - https://www.cvxgrp.org/CVXR/reference/mul_elemwise.html - - - https://www.cvxgrp.org/CVXR/reference/multiply.html - - - https://www.cvxgrp.org/CVXR/reference/name.html - - - https://www.cvxgrp.org/CVXR/reference/neg.html - - - https://www.cvxgrp.org/CVXR/reference/norm.html - - - https://www.cvxgrp.org/CVXR/reference/norm1.html - - - https://www.cvxgrp.org/CVXR/reference/norm2.html - - - https://www.cvxgrp.org/CVXR/reference/norm_inf.html - - - https://www.cvxgrp.org/CVXR/reference/norm_nuc.html - - - https://www.cvxgrp.org/CVXR/reference/one_minus_pos.html - - - https://www.cvxgrp.org/CVXR/reference/p_norm.html - - - https://www.cvxgrp.org/CVXR/reference/perform.html - - - https://www.cvxgrp.org/CVXR/reference/pf_eigenvalue.html - - - https://www.cvxgrp.org/CVXR/reference/pos.html - - - https://www.cvxgrp.org/CVXR/reference/power.html - - - https://www.cvxgrp.org/CVXR/reference/problem-parts.html - - - https://www.cvxgrp.org/CVXR/reference/prod_entries.html - - - https://www.cvxgrp.org/CVXR/reference/project-methods.html - - - https://www.cvxgrp.org/CVXR/reference/psd_coeff_offset.html - - - https://www.cvxgrp.org/CVXR/reference/psolve.html - - - https://www.cvxgrp.org/CVXR/reference/quad_form.html - - - https://www.cvxgrp.org/CVXR/reference/quad_over_lin.html - - - https://www.cvxgrp.org/CVXR/reference/reduce.html - - - https://www.cvxgrp.org/CVXR/reference/resetOptions.html - - - https://www.cvxgrp.org/CVXR/reference/reshape_expr.html - - - https://www.cvxgrp.org/CVXR/reference/residual-methods.html - - - https://www.cvxgrp.org/CVXR/reference/retrieve.html - - - https://www.cvxgrp.org/CVXR/reference/scaled_lower_tri.html - - - https://www.cvxgrp.org/CVXR/reference/scaled_upper_tri.html - - - https://www.cvxgrp.org/CVXR/reference/scalene.html - - - https://www.cvxgrp.org/CVXR/reference/setIdCounter.html - - - https://www.cvxgrp.org/CVXR/reference/sigma_max.html - - - https://www.cvxgrp.org/CVXR/reference/sign-methods.html - - - https://www.cvxgrp.org/CVXR/reference/sign.html - - - https://www.cvxgrp.org/CVXR/reference/sign_from_args.html - - - https://www.cvxgrp.org/CVXR/reference/size-methods.html - - - https://www.cvxgrp.org/CVXR/reference/size.html - - - https://www.cvxgrp.org/CVXR/reference/sqrt.html - - - https://www.cvxgrp.org/CVXR/reference/square.html - - - https://www.cvxgrp.org/CVXR/reference/sum_entries.html - - - https://www.cvxgrp.org/CVXR/reference/sum_largest.html - - - https://www.cvxgrp.org/CVXR/reference/sum_smallest.html - - - https://www.cvxgrp.org/CVXR/reference/sum_squares.html - - - https://www.cvxgrp.org/CVXR/reference/to_numeric.html - - - https://www.cvxgrp.org/CVXR/reference/transpose.html - - - https://www.cvxgrp.org/CVXR/reference/tri_to_full.html - - - https://www.cvxgrp.org/CVXR/reference/triu_to_full.html - - - https://www.cvxgrp.org/CVXR/reference/tv.html - - - https://www.cvxgrp.org/CVXR/reference/unpack_results.html - - - https://www.cvxgrp.org/CVXR/reference/updated_scaled_lower_tri.html - - - https://www.cvxgrp.org/CVXR/reference/upper_tri.html - - - https://www.cvxgrp.org/CVXR/reference/validate_args.html - - - https://www.cvxgrp.org/CVXR/reference/validate_val.html - - - https://www.cvxgrp.org/CVXR/reference/value-methods.html - - - https://www.cvxgrp.org/CVXR/reference/vec.html - - - https://www.cvxgrp.org/CVXR/reference/vectorized_lower_tri_to_mat.html - - - https://www.cvxgrp.org/CVXR/reference/vstack.html - + +https://www.cvxgrp.org/CVXR/404.html +https://www.cvxgrp.org/CVXR/LICENSE-text.html +https://www.cvxgrp.org/CVXR/articles/cvxr_intro.html +https://www.cvxgrp.org/CVXR/articles/index.html +https://www.cvxgrp.org/CVXR/articles/version1.html +https://www.cvxgrp.org/CVXR/authors.html +https://www.cvxgrp.org/CVXR/index.html +https://www.cvxgrp.org/CVXR/news/index.html +https://www.cvxgrp.org/CVXR/reference/Abs-class.html +https://www.cvxgrp.org/CVXR/reference/AddExpression-class.html +https://www.cvxgrp.org/CVXR/reference/AffAtom-class.html +https://www.cvxgrp.org/CVXR/reference/Atom-class.html +https://www.cvxgrp.org/CVXR/reference/AxisAtom-class.html +https://www.cvxgrp.org/CVXR/reference/BinaryOperator-class.html +https://www.cvxgrp.org/CVXR/reference/CBC_CONIC-class.html +https://www.cvxgrp.org/CVXR/reference/CLARABEL-class.html +https://www.cvxgrp.org/CVXR/reference/CLARABEL.dims_to_solver_dict.html +https://www.cvxgrp.org/CVXR/reference/CLARABEL.extract_dual_value.html +https://www.cvxgrp.org/CVXR/reference/CPLEX_CONIC-class.html +https://www.cvxgrp.org/CVXR/reference/CPLEX_QP-class.html +https://www.cvxgrp.org/CVXR/reference/CVXOPT-class.html +https://www.cvxgrp.org/CVXR/reference/CVXR-package.html +https://www.cvxgrp.org/CVXR/reference/CallbackParam-class.html +https://www.cvxgrp.org/CVXR/reference/Canonical-class.html +https://www.cvxgrp.org/CVXR/reference/Canonicalization-class.html +https://www.cvxgrp.org/CVXR/reference/Chain-class.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real-class.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.abs_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.add.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.at_least_2D.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.binary_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.canonicalize_expr.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.canonicalize_tree.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.conj_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.constant_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.hermitian_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.imag_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.join.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.lambda_sum_largest_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.matrix_frac_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.nonpos_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.norm_nuc_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.param_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.pnorm_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.psd_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.quad_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.quad_over_lin_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.real_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.separable_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.soc_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.variable_canon.html +https://www.cvxgrp.org/CVXR/reference/Complex2Real.zero_canon.html +https://www.cvxgrp.org/CVXR/reference/ConeDims-class.html +https://www.cvxgrp.org/CVXR/reference/ConeMatrixStuffing-class.html +https://www.cvxgrp.org/CVXR/reference/ConicSolver-class.html +https://www.cvxgrp.org/CVXR/reference/ConicSolver.get_coeff_offset.html +https://www.cvxgrp.org/CVXR/reference/ConicSolver.get_spacing_matrix.html +https://www.cvxgrp.org/CVXR/reference/Conjugate-class.html +https://www.cvxgrp.org/CVXR/reference/Constant-class.html +https://www.cvxgrp.org/CVXR/reference/ConstantSolver-class.html +https://www.cvxgrp.org/CVXR/reference/Constraint-class.html +https://www.cvxgrp.org/CVXR/reference/Conv-class.html +https://www.cvxgrp.org/CVXR/reference/CumMax-class.html +https://www.cvxgrp.org/CVXR/reference/CumSum-class.html +https://www.cvxgrp.org/CVXR/reference/CvxAttr2Constr-class.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone-class.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.entr_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.exp_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.geo_mean_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.huber_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.indicator_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.kl_div_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.lambda_max_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.lambda_sum_largest_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.log1p_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.log_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.log_det_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.log_sum_exp_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.logistic_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.matrix_frac_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.normNuc_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.pnorm_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.power_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.quad_form_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.quad_over_lin_canon.html +https://www.cvxgrp.org/CVXR/reference/Dcp2Cone.sigma_max_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp-class.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.add_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.constant_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.div_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.exp_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.eye_minus_inv_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.geo_mean_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.log_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.mul_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.mulexpression_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.nonpos_constr_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.norm1_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.norm_inf_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.one_minus_pos_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.parameter_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.pf_eigenvalue_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.pnorm_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.power_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.prod_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.quad_form_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.quad_over_lin_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.sum_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.trace_canon.html +https://www.cvxgrp.org/CVXR/reference/Dgp2Dcp.zero_constr_canon.html +https://www.cvxgrp.org/CVXR/reference/DgpCanonMethods-class.html +https://www.cvxgrp.org/CVXR/reference/Diag-int.html +https://www.cvxgrp.org/CVXR/reference/DiagMat-class.html +https://www.cvxgrp.org/CVXR/reference/DiagVec-class.html +https://www.cvxgrp.org/CVXR/reference/Diff-int.html +https://www.cvxgrp.org/CVXR/reference/DiffPos.html +https://www.cvxgrp.org/CVXR/reference/DivExpression-class.html +https://www.cvxgrp.org/CVXR/reference/ECOS-class.html +https://www.cvxgrp.org/CVXR/reference/ECOS.dims_to_solver_dict.html +https://www.cvxgrp.org/CVXR/reference/ECOS_BB-class.html +https://www.cvxgrp.org/CVXR/reference/Elementwise-class.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl-class.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl.abs_canon.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl.cummax_canon.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl.cumsum_canon.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl.max_elemwise_canon.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl.max_entries_canon.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl.min_elemwise_canon.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl.min_entries_canon.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl.norm1_canon.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl.norm_inf_canon.html +https://www.cvxgrp.org/CVXR/reference/EliminatePwl.sum_largest_canon.html +https://www.cvxgrp.org/CVXR/reference/Entr-class.html +https://www.cvxgrp.org/CVXR/reference/EqConstraint-class.html +https://www.cvxgrp.org/CVXR/reference/EvalParams-class.html +https://www.cvxgrp.org/CVXR/reference/Exp-class.html +https://www.cvxgrp.org/CVXR/reference/ExpCone-class.html +https://www.cvxgrp.org/CVXR/reference/Expression-class.html +https://www.cvxgrp.org/CVXR/reference/EyeMinusInv-class.html +https://www.cvxgrp.org/CVXR/reference/FlipObjective-class.html +https://www.cvxgrp.org/CVXR/reference/GLPK-class.html +https://www.cvxgrp.org/CVXR/reference/GLPK_MI-class.html +https://www.cvxgrp.org/CVXR/reference/GUROBI_CONIC-class.html +https://www.cvxgrp.org/CVXR/reference/GUROBI_QP-class.html +https://www.cvxgrp.org/CVXR/reference/GeoMean-class.html +https://www.cvxgrp.org/CVXR/reference/HStack-class.html +https://www.cvxgrp.org/CVXR/reference/HarmonicMean.html +https://www.cvxgrp.org/CVXR/reference/Huber-class.html +https://www.cvxgrp.org/CVXR/reference/Imag-class.html +https://www.cvxgrp.org/CVXR/reference/Index-class.html +https://www.cvxgrp.org/CVXR/reference/IneqConstraint-class.html +https://www.cvxgrp.org/CVXR/reference/InverseData-class.html +https://www.cvxgrp.org/CVXR/reference/KLDiv-class.html +https://www.cvxgrp.org/CVXR/reference/Kron-class.html +https://www.cvxgrp.org/CVXR/reference/LambdaMax-class.html +https://www.cvxgrp.org/CVXR/reference/LambdaMin.html +https://www.cvxgrp.org/CVXR/reference/LambdaSumLargest-class.html +https://www.cvxgrp.org/CVXR/reference/LambdaSumSmallest.html +https://www.cvxgrp.org/CVXR/reference/Leaf-class.html +https://www.cvxgrp.org/CVXR/reference/ListORConstr-class.html +https://www.cvxgrp.org/CVXR/reference/Log-class.html +https://www.cvxgrp.org/CVXR/reference/Log1p-class.html +https://www.cvxgrp.org/CVXR/reference/LogDet-class.html +https://www.cvxgrp.org/CVXR/reference/LogSumExp-class.html +https://www.cvxgrp.org/CVXR/reference/Logistic-class.html +https://www.cvxgrp.org/CVXR/reference/MOSEK-class.html +https://www.cvxgrp.org/CVXR/reference/MOSEK.parse_dual_vars.html +https://www.cvxgrp.org/CVXR/reference/MOSEK.recover_dual_variables.html +https://www.cvxgrp.org/CVXR/reference/MatrixFrac-class.html +https://www.cvxgrp.org/CVXR/reference/MatrixStuffing-class.html +https://www.cvxgrp.org/CVXR/reference/MaxElemwise-class.html +https://www.cvxgrp.org/CVXR/reference/MaxEntries-class.html +https://www.cvxgrp.org/CVXR/reference/Maximize-class.html +https://www.cvxgrp.org/CVXR/reference/MinElemwise-class.html +https://www.cvxgrp.org/CVXR/reference/MinEntries-class.html +https://www.cvxgrp.org/CVXR/reference/Minimize-class.html +https://www.cvxgrp.org/CVXR/reference/MixedNorm.html +https://www.cvxgrp.org/CVXR/reference/MulExpression-class.html +https://www.cvxgrp.org/CVXR/reference/Multiply-class.html +https://www.cvxgrp.org/CVXR/reference/Neg-int.html +https://www.cvxgrp.org/CVXR/reference/NegExpression-class.html +https://www.cvxgrp.org/CVXR/reference/NonPosConstraint-class.html +https://www.cvxgrp.org/CVXR/reference/NonlinearConstraint-class.html +https://www.cvxgrp.org/CVXR/reference/Norm-atom.html +https://www.cvxgrp.org/CVXR/reference/Norm1-class.html +https://www.cvxgrp.org/CVXR/reference/Norm2-atom.html +https://www.cvxgrp.org/CVXR/reference/NormInf-class.html +https://www.cvxgrp.org/CVXR/reference/NormNuc-class.html +https://www.cvxgrp.org/CVXR/reference/OSQP-class.html +https://www.cvxgrp.org/CVXR/reference/Objective-arith.html +https://www.cvxgrp.org/CVXR/reference/Objective-class.html +https://www.cvxgrp.org/CVXR/reference/OneMinusPos-class.html +https://www.cvxgrp.org/CVXR/reference/PSDConstraint-class.html +https://www.cvxgrp.org/CVXR/reference/PSDWrap-class.html +https://www.cvxgrp.org/CVXR/reference/Parameter-class.html +https://www.cvxgrp.org/CVXR/reference/PfEigenvalue-class.html +https://www.cvxgrp.org/CVXR/reference/Pnorm-class.html +https://www.cvxgrp.org/CVXR/reference/Pos-int.html +https://www.cvxgrp.org/CVXR/reference/Power-class.html +https://www.cvxgrp.org/CVXR/reference/Problem-arith.html +https://www.cvxgrp.org/CVXR/reference/Problem-class.html +https://www.cvxgrp.org/CVXR/reference/ProdEntries-class.html +https://www.cvxgrp.org/CVXR/reference/Promote-class.html +https://www.cvxgrp.org/CVXR/reference/Qp2SymbolicQp-class.html +https://www.cvxgrp.org/CVXR/reference/QpMatrixStuffing-class.html +https://www.cvxgrp.org/CVXR/reference/QpSolver-class.html +https://www.cvxgrp.org/CVXR/reference/QuadForm-class.html +https://www.cvxgrp.org/CVXR/reference/QuadOverLin-class.html +https://www.cvxgrp.org/CVXR/reference/Rdict-class.html +https://www.cvxgrp.org/CVXR/reference/Rdictdefault-class.html +https://www.cvxgrp.org/CVXR/reference/Real-class.html +https://www.cvxgrp.org/CVXR/reference/Reduction-class.html +https://www.cvxgrp.org/CVXR/reference/ReductionSolver-class.html +https://www.cvxgrp.org/CVXR/reference/Reshape-class.html +https://www.cvxgrp.org/CVXR/reference/SCS-class.html +https://www.cvxgrp.org/CVXR/reference/SCS.dims_to_solver_dict.html +https://www.cvxgrp.org/CVXR/reference/SCS.extract_dual_value.html +https://www.cvxgrp.org/CVXR/reference/SOC-class.html +https://www.cvxgrp.org/CVXR/reference/SOCAxis-class.html +https://www.cvxgrp.org/CVXR/reference/SigmaMax-class.html +https://www.cvxgrp.org/CVXR/reference/SizeMetrics-class.html +https://www.cvxgrp.org/CVXR/reference/Solution-class.html +https://www.cvxgrp.org/CVXR/reference/SolverStats-class.html +https://www.cvxgrp.org/CVXR/reference/SolvingChain-class.html +https://www.cvxgrp.org/CVXR/reference/SpecialIndex-class.html +https://www.cvxgrp.org/CVXR/reference/SumEntries-class.html +https://www.cvxgrp.org/CVXR/reference/SumLargest-class.html +https://www.cvxgrp.org/CVXR/reference/SumSmallest.html +https://www.cvxgrp.org/CVXR/reference/SumSquares.html +https://www.cvxgrp.org/CVXR/reference/SymbolicQuadForm-class.html +https://www.cvxgrp.org/CVXR/reference/TotalVariation.html +https://www.cvxgrp.org/CVXR/reference/Trace-class.html +https://www.cvxgrp.org/CVXR/reference/Transpose-class.html +https://www.cvxgrp.org/CVXR/reference/UnaryOperator-class.html +https://www.cvxgrp.org/CVXR/reference/UpperTri-class.html +https://www.cvxgrp.org/CVXR/reference/VStack-class.html +https://www.cvxgrp.org/CVXR/reference/Variable-class.html +https://www.cvxgrp.org/CVXR/reference/Wrap-class.html +https://www.cvxgrp.org/CVXR/reference/ZeroConstraint-class.html +https://www.cvxgrp.org/CVXR/reference/abs.html +https://www.cvxgrp.org/CVXR/reference/accepts.html +https://www.cvxgrp.org/CVXR/reference/are_args_affine.html +https://www.cvxgrp.org/CVXR/reference/bmat.html +https://www.cvxgrp.org/CVXR/reference/canonicalize.html +https://www.cvxgrp.org/CVXR/reference/cdiac.html +https://www.cvxgrp.org/CVXR/reference/complex-atoms.html +https://www.cvxgrp.org/CVXR/reference/complex-methods.html +https://www.cvxgrp.org/CVXR/reference/cone-methods.html +https://www.cvxgrp.org/CVXR/reference/constr_value.html +https://www.cvxgrp.org/CVXR/reference/construct_intermediate_chain-Problem-list-method.html +https://www.cvxgrp.org/CVXR/reference/construct_solving_chain.html +https://www.cvxgrp.org/CVXR/reference/conv.html +https://www.cvxgrp.org/CVXR/reference/cummax_axis.html +https://www.cvxgrp.org/CVXR/reference/cumsum_axis.html +https://www.cvxgrp.org/CVXR/reference/curvature-atom.html +https://www.cvxgrp.org/CVXR/reference/curvature-comp.html +https://www.cvxgrp.org/CVXR/reference/curvature-methods.html +https://www.cvxgrp.org/CVXR/reference/curvature.html +https://www.cvxgrp.org/CVXR/reference/cvxr_norm.html +https://www.cvxgrp.org/CVXR/reference/diag.html +https://www.cvxgrp.org/CVXR/reference/diff.html +https://www.cvxgrp.org/CVXR/reference/dim_from_args.html +https://www.cvxgrp.org/CVXR/reference/domain.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOpVector__new.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOpVector__push_back.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__args_push_back.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_dense_data.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_id.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_size.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_slice.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_sparse.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_sparse_data.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__get_type.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__new.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_dense_data.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_size.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_slice.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_sparse.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_sparse_data.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__set_type.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__size_push_back.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp__slice_push_back.html +https://www.cvxgrp.org/CVXR/reference/dot-LinOp_at_index.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_I.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_J.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_V.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_const_to_row.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_const_vec.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__get_id_to_col.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__new.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_I.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_J.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_V.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_const_to_row.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_const_vec.html +https://www.cvxgrp.org/CVXR/reference/dot-ProblemData__set_id_to_col.html +https://www.cvxgrp.org/CVXR/reference/dot-build_matrix_0.html +https://www.cvxgrp.org/CVXR/reference/dot-build_matrix_1.html +https://www.cvxgrp.org/CVXR/reference/dot-decomp_quad.html +https://www.cvxgrp.org/CVXR/reference/dot-p_norm.html +https://www.cvxgrp.org/CVXR/reference/dspop.html +https://www.cvxgrp.org/CVXR/reference/dssamp.html +https://www.cvxgrp.org/CVXR/reference/dual_value-methods.html +https://www.cvxgrp.org/CVXR/reference/entr.html +https://www.cvxgrp.org/CVXR/reference/exp.html +https://www.cvxgrp.org/CVXR/reference/expression-parts.html +https://www.cvxgrp.org/CVXR/reference/extract_dual_value.html +https://www.cvxgrp.org/CVXR/reference/extract_mip_idx.html +https://www.cvxgrp.org/CVXR/reference/eye_minus_inv.html +https://www.cvxgrp.org/CVXR/reference/format_constr.html +https://www.cvxgrp.org/CVXR/reference/geo_mean.html +https://www.cvxgrp.org/CVXR/reference/get_data.html +https://www.cvxgrp.org/CVXR/reference/get_dual_values.html +https://www.cvxgrp.org/CVXR/reference/get_id.html +https://www.cvxgrp.org/CVXR/reference/get_np.html +https://www.cvxgrp.org/CVXR/reference/get_problem_data.html +https://www.cvxgrp.org/CVXR/reference/get_sp.html +https://www.cvxgrp.org/CVXR/reference/grad.html +https://www.cvxgrp.org/CVXR/reference/graph_implementation.html +https://www.cvxgrp.org/CVXR/reference/group_constraints.html +https://www.cvxgrp.org/CVXR/reference/harmonic_mean.html +https://www.cvxgrp.org/CVXR/reference/hstack.html +https://www.cvxgrp.org/CVXR/reference/huber.html +https://www.cvxgrp.org/CVXR/reference/id.html +https://www.cvxgrp.org/CVXR/reference/import_solver.html +https://www.cvxgrp.org/CVXR/reference/index.html +https://www.cvxgrp.org/CVXR/reference/installed_solvers.html +https://www.cvxgrp.org/CVXR/reference/inv_pos.html +https://www.cvxgrp.org/CVXR/reference/invert.html +https://www.cvxgrp.org/CVXR/reference/is_dcp.html +https://www.cvxgrp.org/CVXR/reference/is_dgp.html +https://www.cvxgrp.org/CVXR/reference/is_mixed_integer.html +https://www.cvxgrp.org/CVXR/reference/is_qp.html +https://www.cvxgrp.org/CVXR/reference/is_stuffed_cone_constraint.html +https://www.cvxgrp.org/CVXR/reference/is_stuffed_cone_objective.html +https://www.cvxgrp.org/CVXR/reference/is_stuffed_qp_objective.html +https://www.cvxgrp.org/CVXR/reference/kl_div.html +https://www.cvxgrp.org/CVXR/reference/kronecker.html +https://www.cvxgrp.org/CVXR/reference/lambda_max.html +https://www.cvxgrp.org/CVXR/reference/lambda_min.html +https://www.cvxgrp.org/CVXR/reference/lambda_sum_largest.html +https://www.cvxgrp.org/CVXR/reference/lambda_sum_smallest.html +https://www.cvxgrp.org/CVXR/reference/leaf-attr.html +https://www.cvxgrp.org/CVXR/reference/linearize.html +https://www.cvxgrp.org/CVXR/reference/log.html +https://www.cvxgrp.org/CVXR/reference/log_det.html +https://www.cvxgrp.org/CVXR/reference/log_log_curvature-atom.html +https://www.cvxgrp.org/CVXR/reference/log_log_curvature-methods.html +https://www.cvxgrp.org/CVXR/reference/log_log_curvature.html +https://www.cvxgrp.org/CVXR/reference/log_sum_exp.html +https://www.cvxgrp.org/CVXR/reference/logistic.html +https://www.cvxgrp.org/CVXR/reference/make_sparse_diagonal_matrix.html +https://www.cvxgrp.org/CVXR/reference/matrix_frac.html +https://www.cvxgrp.org/CVXR/reference/matrix_prop-methods.html +https://www.cvxgrp.org/CVXR/reference/matrix_trace.html +https://www.cvxgrp.org/CVXR/reference/max_elemwise.html +https://www.cvxgrp.org/CVXR/reference/max_entries.html +https://www.cvxgrp.org/CVXR/reference/mean.html +https://www.cvxgrp.org/CVXR/reference/min_elemwise.html +https://www.cvxgrp.org/CVXR/reference/min_entries.html +https://www.cvxgrp.org/CVXR/reference/mip_capable.html +https://www.cvxgrp.org/CVXR/reference/mixed_norm.html +https://www.cvxgrp.org/CVXR/reference/mul_elemwise.html +https://www.cvxgrp.org/CVXR/reference/multiply.html +https://www.cvxgrp.org/CVXR/reference/name.html +https://www.cvxgrp.org/CVXR/reference/neg.html +https://www.cvxgrp.org/CVXR/reference/norm.html +https://www.cvxgrp.org/CVXR/reference/norm1.html +https://www.cvxgrp.org/CVXR/reference/norm2.html +https://www.cvxgrp.org/CVXR/reference/norm_inf.html +https://www.cvxgrp.org/CVXR/reference/norm_nuc.html +https://www.cvxgrp.org/CVXR/reference/one_minus_pos.html +https://www.cvxgrp.org/CVXR/reference/p_norm.html +https://www.cvxgrp.org/CVXR/reference/perform.html +https://www.cvxgrp.org/CVXR/reference/pf_eigenvalue.html +https://www.cvxgrp.org/CVXR/reference/pos.html +https://www.cvxgrp.org/CVXR/reference/power.html +https://www.cvxgrp.org/CVXR/reference/problem-parts.html +https://www.cvxgrp.org/CVXR/reference/prod_entries.html +https://www.cvxgrp.org/CVXR/reference/project-methods.html +https://www.cvxgrp.org/CVXR/reference/psd_coeff_offset.html +https://www.cvxgrp.org/CVXR/reference/psolve.html +https://www.cvxgrp.org/CVXR/reference/quad_form.html +https://www.cvxgrp.org/CVXR/reference/quad_over_lin.html +https://www.cvxgrp.org/CVXR/reference/reduce.html +https://www.cvxgrp.org/CVXR/reference/resetOptions.html +https://www.cvxgrp.org/CVXR/reference/reshape_expr.html +https://www.cvxgrp.org/CVXR/reference/residual-methods.html +https://www.cvxgrp.org/CVXR/reference/retrieve.html +https://www.cvxgrp.org/CVXR/reference/scaled_lower_tri.html +https://www.cvxgrp.org/CVXR/reference/scaled_upper_tri.html +https://www.cvxgrp.org/CVXR/reference/scalene.html +https://www.cvxgrp.org/CVXR/reference/setIdCounter.html +https://www.cvxgrp.org/CVXR/reference/sigma_max.html +https://www.cvxgrp.org/CVXR/reference/sign-methods.html +https://www.cvxgrp.org/CVXR/reference/sign.html +https://www.cvxgrp.org/CVXR/reference/sign_from_args.html +https://www.cvxgrp.org/CVXR/reference/size-methods.html +https://www.cvxgrp.org/CVXR/reference/size.html +https://www.cvxgrp.org/CVXR/reference/sqrt.html +https://www.cvxgrp.org/CVXR/reference/square.html +https://www.cvxgrp.org/CVXR/reference/sum_entries.html +https://www.cvxgrp.org/CVXR/reference/sum_largest.html +https://www.cvxgrp.org/CVXR/reference/sum_smallest.html +https://www.cvxgrp.org/CVXR/reference/sum_squares.html +https://www.cvxgrp.org/CVXR/reference/to_numeric.html +https://www.cvxgrp.org/CVXR/reference/transpose.html +https://www.cvxgrp.org/CVXR/reference/tri_to_full.html +https://www.cvxgrp.org/CVXR/reference/triu_to_full.html +https://www.cvxgrp.org/CVXR/reference/tv.html +https://www.cvxgrp.org/CVXR/reference/unpack_results.html +https://www.cvxgrp.org/CVXR/reference/updated_scaled_lower_tri.html +https://www.cvxgrp.org/CVXR/reference/upper_tri.html +https://www.cvxgrp.org/CVXR/reference/validate_args.html +https://www.cvxgrp.org/CVXR/reference/validate_val.html +https://www.cvxgrp.org/CVXR/reference/value-methods.html +https://www.cvxgrp.org/CVXR/reference/vec.html +https://www.cvxgrp.org/CVXR/reference/vectorized_lower_tri_to_mat.html +https://www.cvxgrp.org/CVXR/reference/vstack.html + diff --git a/inst/extdata/gurobi_status_codes.csv b/inst/extdata/gurobi_status_codes.csv new file mode 100644 index 00000000..35d6b774 --- /dev/null +++ b/inst/extdata/gurobi_status_codes.csv @@ -0,0 +1,18 @@ +"status","code","cvxr_status","desc" +"LOADED",1,"solver_error","Model is loaded, but no solution information is available." +"OPTIMAL",2,"optimal","Model was solved to optimality (subject to tolerances), and an optimal solution is available." +"INFEASIBLE",3,"infeasible","Model was proven to be infeasible." +"INF_OR_UNBND",4,"infeasible_or_unbounded","Model was proven to be either infeasible or unbounded. To obtain a more definitive conclusion, set the DualReductions parameter to 0 and reoptimize." +"UNBOUNDED",5,"unbounded","Model was proven to be unbounded. Important note: an unbounded status indicates the presence of an unbounded ray that allows the objective to improve without limit. It says nothing about whether the model has a feasible solution. If you require information on feasibility, you should set the objective to zero and reoptimize." +"CUTOFF",6,"infeasible","Optimal objective for model was proven to be worse than the value specified in the Cutoff parameter. No solution information is available." +"ITERATION_LIMIT",7,"solver_error","Optimization terminated because the total number of simplex iterations performed exceeded the value specified in the IterationLimit parameter, or because the total number of barrier iterations exceeded the value specified in the BarIterLimit parameter." +"NODE_LIMIT",8,"solver_error","Optimization terminated because the total number of branch-and-cut nodes explored exceeded the value specified in the NodeLimit parameter." +"TIME_LIMIT",9,"infeasible_inaccurate","Optimization terminated because the time expended exceeded the value specified in the TimeLimit parameter." +"SOLUTION_LIMIT",10,"solver_error","Optimization terminated because the number of solutions found reached the value specified in the SolutionLimit parameter." +"INTERRUPTED",11,"solver_error","Optimization was terminated by the user." +"NUMERIC",12,"solver_error","Optimization was terminated due to unrecoverable numerical difficulties." +"SUBOPTIMAL",13,"optimal_inaccurate","Unable to satisfy optimality tolerances; a sub-optimal solution is available." +"INPROGRESS",14,"solver_error","An asynchronous optimization call was made, but the associated optimization run is not yet complete." +"USER_OBJ_LIMIT",15,"solver_error","User specified an objective limit (a bound on either the best objective or the best bound), and that limit has been reached." +"WORK_LIMIT",16,"solver_error","Optimization terminated because the work expended exceeded the value specified in the WorkLimit parameter." +"MEM_LIMIT",17,"solver_error","Optimization terminated because the total amount of allocated memory exceeded the value specified in the SoftMemLimit parameter." diff --git a/man/figures/logo.png b/man/figures/logo.png new file mode 100644 index 00000000..a47016aa Binary files /dev/null and b/man/figures/logo.png differ diff --git a/man/figures/logo.svg b/man/figures/logo.svg new file mode 100644 index 00000000..4a694ffc --- /dev/null +++ b/man/figures/logo.svg @@ -0,0 +1,1847 @@ + + + + + + diff --git a/src/CVXR.dll b/src/CVXR.dll deleted file mode 100644 index 9b204626..00000000 Binary files a/src/CVXR.dll and /dev/null differ diff --git a/src/RcppConv.cpp b/src/RcppConv.cpp index c5fbd858..a4684426 100644 --- a/src/RcppConv.cpp +++ b/src/RcppConv.cpp @@ -73,3 +73,28 @@ void sweep_in_place(Rcpp::NumericMatrix P, Rcpp::NumericVector c_part) { } } } + +// [[Rcpp::depends(RcppEigen)]] +// [[Rcpp::export]] +Eigen::SparseMatrix upper_tri_to_full(int n) { + if (n == 0) { + Eigen::SparseMatrix result(0, 0); + return result; + } else { + int entries = floor((double) n * ((double) n + 1.0) / 2.0); + std::vector> triplets; + int count = 0; + for (int i = 0; i < n; ++i) { + for (int j = i; j < n; ++j) { + triplets.emplace_back(j * n + i, count, 1.0); + if (i != j) { + triplets.emplace_back(i * n + j, count, 1.0); + } + count++; + } + } + Eigen::SparseMatrix result(n * n, entries); + result.setFromTriplets(triplets.begin(), triplets.end()); + return result; + } +} diff --git a/src/RcppExports.cpp b/src/RcppExports.cpp index 0ba6c3f4..18eb976e 100644 --- a/src/RcppExports.cpp +++ b/src/RcppExports.cpp @@ -71,6 +71,17 @@ BEGIN_RCPP return R_NilValue; END_RCPP } +// upper_tri_to_full +Eigen::SparseMatrix upper_tri_to_full(int n); +RcppExport SEXP _CVXR_upper_tri_to_full(SEXP nSEXP) { +BEGIN_RCPP + Rcpp::RObject rcpp_result_gen; + Rcpp::RNGScope rcpp_rngScope_gen; + Rcpp::traits::input_parameter< int >::type n(nSEXP); + rcpp_result_gen = Rcpp::wrap(upper_tri_to_full(n)); + return rcpp_result_gen; +END_RCPP +} // LinOp__new SEXP LinOp__new(); RcppExport SEXP _CVXR_LinOp__new() { @@ -439,6 +450,7 @@ static const R_CallMethodDef CallEntries[] = { {"_CVXR_cpp_convolve", (DL_FUNC) &_CVXR_cpp_convolve, 2}, {"_CVXR_multiply_dgCMatrix_vector", (DL_FUNC) &_CVXR_multiply_dgCMatrix_vector, 2}, {"_CVXR_sweep_in_place", (DL_FUNC) &_CVXR_sweep_in_place, 2}, + {"_CVXR_upper_tri_to_full", (DL_FUNC) &_CVXR_upper_tri_to_full, 1}, {"_CVXR_LinOp__new", (DL_FUNC) &_CVXR_LinOp__new, 0}, {"_CVXR_LinOp__get_sparse", (DL_FUNC) &_CVXR_LinOp__get_sparse, 1}, {"_CVXR_LinOp__set_sparse", (DL_FUNC) &_CVXR_LinOp__set_sparse, 2}, diff --git a/tests/testthat/test-g05-gurobi.R b/tests/testthat/test-g05-gurobi.R index 42f0b7ca..4a9c050e 100644 --- a/tests/testthat/test-g05-gurobi.R +++ b/tests/testthat/test-g05-gurobi.R @@ -30,7 +30,7 @@ test_that("test a simple mixed integer program for GUROBI", { prob <- Problem(obj, constraint) cvxr <- solve(prob, solver="GUROBI") - expect_equal(cvxr$status, "optimal") + expect_true(cvxr$status == "optimal") expect_equal(cvxr$value, gurobiResult$objval, tolerance = 1e-4) expect_equal(cvxr$getValue(xvar), matrix(gurobiResult$x), tolerance = 1e-4) @@ -61,7 +61,7 @@ test_that("test a simple QP for GUROBI",{ prob <- Problem(obj, constraint) cvxr <- solve(prob, solver="GUROBI") - expect_equal(cvxr$status, "optimal") + expect_true(cvxr$status == "optimal") expect_equal(cvxr$value, gurobiResult$objval, tolerance = 1e-4) expect_equal(cvxr$getValue(xvar), matrix(gurobiResult$x), tolerance = 1e-4) diff --git a/tests/testthat/test-g05-solver_tests.R b/tests/testthat/test-g05-solver_tests.R index e4333dfd..9f8917ec 100644 --- a/tests/testthat/test-g05-solver_tests.R +++ b/tests/testthat/test-g05-solver_tests.R @@ -171,7 +171,8 @@ test_that("Test a basic SDP with all solvers", { .8590441, -.1760618, .11665767, -.17606183, .03608155), nrow = n) # SCS and MOSEK and CVXOPT, CLARABEL are the only solvers that support SDPs - for(solver in intersect(INSTALLED_SOLVERS, c("SCS", "MOSEK", "CVXOPT", "CLARABEL"))) { + ## Not adding clarabel for now + for(solver in intersect(INSTALLED_SOLVERS, c("SCS", "MOSEK", "CVXOPT"))) { result <- solve(prob, solver = solver) print(sprintf("Solver: %s status: %s\n", solver, result$status)) expect_equal(result$value, 1.395479, tolerance=TOL) @@ -212,7 +213,8 @@ test_that("Test a simple geometric program", { y <= 2*x, z >=1) prob <- Problem(Maximize(obj), constraints) - for(solver in c("ECOS", "SCS", "CLARABEL")){ + ## Leave out CLARABEL for now + for(solver in c("ECOS", "SCS")){ result <- solve(prob, solver=solver, gp=TRUE) expect_equal(result$value, 2, tolerance=TOL) expect_equal(result$getValue(x), 1, tolerance=TOL)