[Qca-commits] r59 - in pkg: . R inst inst/gui/www/js inst/staticdocs man src
noreply at r-forge.r-project.org
noreply at r-forge.r-project.org
Mon Nov 5 21:12:53 CET 2018
Author: dusadrian
Date: 2018-11-05 21:12:53 +0100 (Mon, 05 Nov 2018)
New Revision: 59
Modified:
pkg/DESCRIPTION
pkg/R/getSolution.R
pkg/R/minimize.R
pkg/R/solveChart.R
pkg/R/sop.R
pkg/R/verifyQCA.R
pkg/inst/ChangeLog
pkg/inst/gui/www/js/maincode.js
pkg/inst/staticdocs/CV.html
pkg/inst/staticdocs/LegacyDatasets.html
pkg/inst/staticdocs/Lipset.html
pkg/inst/staticdocs/QCA.package.html
pkg/inst/staticdocs/RS.html
pkg/inst/staticdocs/SOPexpression.html
pkg/inst/staticdocs/XYplot.html
pkg/inst/staticdocs/Xplot.html
pkg/inst/staticdocs/calibrate.html
pkg/inst/staticdocs/causalChain.html
pkg/inst/staticdocs/chartFunctions.html
pkg/inst/staticdocs/export.html
pkg/inst/staticdocs/factorize.html
pkg/inst/staticdocs/findRows.html
pkg/inst/staticdocs/findTh.html
pkg/inst/staticdocs/fuzzyops.html
pkg/inst/staticdocs/implicantMatrixFunctions.html
pkg/inst/staticdocs/index.html
pkg/inst/staticdocs/intersection.html
pkg/inst/staticdocs/minimize.html
pkg/inst/staticdocs/modelFit.html
pkg/inst/staticdocs/negate.html
pkg/inst/staticdocs/pof.html
pkg/inst/staticdocs/recode.html
pkg/inst/staticdocs/retention.html
pkg/inst/staticdocs/runGUI.html
pkg/inst/staticdocs/subsetsAndSupersets.html
pkg/inst/staticdocs/truthTable.html
pkg/man/QCA.package.Rd
pkg/src/QCA.c
Log:
version 3.3-5
Modified: pkg/DESCRIPTION
===================================================================
--- pkg/DESCRIPTION 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/DESCRIPTION 2018-11-05 20:12:53 UTC (rev 59)
@@ -1,6 +1,6 @@
Package: QCA
-Version: 3.3-3
-Date: 2018-11-02
+Version: 3.3-5
+Date: 2018-11-05
Title: Qualitative Comparative Analysis
Authors at R: c(person("Adrian", "Dusa", role = c("aut", "cre", "cph"),
email = "dusa.adrian at unibuc.ro"),
@@ -28,7 +28,7 @@
minimal causal combination that explains a given phenomenon.
License: GPL (>= 2)
NeedsCompilation: yes
-Packaged: 2018-11-01 23:20:15 UTC; dusadrian
+Packaged: 2018-11-05 20:11:24 UTC; dusadrian
Author: Adrian Dusa [aut, cre, cph],
jQuery Foundation [cph] (jQuery library and jQuery UI library),
jQuery contributors [ctb, cph] (jQuery library; authors listed in
Modified: pkg/R/getSolution.R
===================================================================
--- pkg/R/getSolution.R 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/R/getSolution.R 2018-11-05 20:12:53 UTC (rev 59)
@@ -36,9 +36,6 @@
if (enter) cat("\n")
stop(simpleError(paste("There are no solutions, given these constraints.", ifelse(enter, "\n\n", ""))))
}
- else {
- sol.matrix[sol.matrix == 0] <- NA
- }
expressions <- expressions[[1]]
}
else if (is.matrix(expressions)) {
Modified: pkg/R/minimize.R
===================================================================
--- pkg/R/minimize.R 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/R/minimize.R 2018-11-05 20:12:53 UTC (rev 59)
@@ -104,9 +104,6 @@
if (is.character(outcome) & !identical(outcome, "")) {
outcome <- splitstr(outcome)
}
- if (is.character(dir.exp) & !identical(dir.exp, "")) {
- dir.exp <- gsub(dashes(), "-", splitstr(dir.exp))
- }
if (methods::is(input, "tt")) {
tt <- input
recdata <- tt$recoded.data
@@ -172,12 +169,8 @@
missings <- which(tt$tt$OUT == "?")
tt$tt <- tt$tt[-missings, ]
}
- dir.exp <- verify.dir.exp(recdata, outcome, conditions, dir.exp)
- if (!identical(dir.exp, "")) {
- names(dir.exp) <- toupper(names(dir.exp))
- }
noflevels <- tt$noflevels
- mbase <- rev(c(1, cumprod(rev(noflevels))))[-1]
+ mbase <- as.integer(rev(c(1, cumprod(rev(noflevels))))[-1])
mbaseplus <- rev(c(1, cumprod(rev(noflevels + 1))))[-1]
alreadyletters <- sum(nchar(colnames(recdata)[-ncol(recdata)])) == ncol(recdata) - 1
tt$tt[seq(length(conditions))] <- as.data.frame(lapply(tt$tt[seq(length(conditions))], function(x) {
@@ -421,94 +414,22 @@
temp <- sort(unique(as.vector(unlist(temp))))
temp <- temp[!is.element(temp, drop(inputt %*% mbaseplus))]
if (length(temp) == 0) return(NULL)
- SAx <- getRow(temp + 1, noflevels + 1) - 1
+ SAx <- getRow(temp + 1, noflevels + 1) - 1L
colnames(SAx) <- colnames(inputt)
rownames(SAx) <- drop(SAx %*% mbase) + 1
return(SAx)
})
prettyNums <- formatC(seq(length(p.sol$solution.list[[1]])), digits = nchar(length(p.sol$solution.list[[1]])) - 1, flag = 0)
- names(output$SA) <- paste("M", prettyNums, sep = "")
if (!identical(dir.exp, "") & !identical(include, "") & !identical(c.sol$solution.list, NA)) {
- i.sol <- vector("list", length(c.sol$solution.list[[1]])*length(p.sol$solution.list[[1]]))
- index <- 1
- for (c.s in seq(length(c.sol$solution.list[[1]]))) {
- c.expressions <- c.sol$reduced$expressions[c.sol$solution.list[[1]][[c.s]], , drop = FALSE]
- for (p.s in seq(length(p.sol$solution.list[[1]]))) {
- p.expressions <- p.sol$reduced$expressions[p.sol$solution.list[[1]][[p.s]], , drop = FALSE]
- dir.exp.matrix <- matrix(ncol = length(conditions), nrow = 0)
- for (i in seq(nrow(c.expressions))) {
- comp <- c.expressions[i, ]
- for (j in seq(nrow(p.expressions))) {
- pars <- p.expressions[j, ]
- if (all(comp[pars > 0] == pars[pars > 0])) {
- equals <- which(pars > 0)
- baseres <- rep(0, length(conditions))
- baseres[equals] <- drop(pars[equals])
- baseres <- as.list(baseres)
- notequals <- setdiff(which(comp > 0), equals)
- if (length(notequals) > 0) {
- if (any(names(dir.exp) == "IDE")) {
- res <- baseres
- for (k in notequals) {
- dir.exp.k <- which(dir.exp$IDE[[conditions[k]]])
- if (is.element(comp[k], dir.exp.k)) {
- equals <- sort(c(equals, k))
- res[[k]] <- dir.exp.k
- }
- }
- if (!identical(res, baseres)) {
- dir.exp.matrix <- rbind(dir.exp.matrix, expand.grid(res))
- }
- }
- if (any(names(dir.exp) == "CDE")) {
- for (cde in seq(length(dir.exp$CDE))) {
- res <- baseres
- truek <- which(unlist(lapply(dir.exp$CDE[[cde]], any)))
- if (length(setdiff(truek, which(comp > 0))) == 0 & length(intersect(truek, notequals)) > 0) {
- if (identical(comp[truek], unlist(lapply(dir.exp$CDE[[cde]], which)))) {
- covered <- FALSE
- for (k in notequals) {
- dir.exp.k <- which(dir.exp$CDE[[cde]][[conditions[k]]])
- if (is.element(comp[k], dir.exp.k)) {
- equals <- sort(c(equals, k))
- res[[k]] <- sort(dir.exp.k)
- }
- }
- }
- dir.exp.matrix <- rbind(dir.exp.matrix, expand.grid(res))
- }
- }
- }
- }
- else {
- }
- }
- }
- }
- colnames(dir.exp.matrix) <- conditions
- dir.exp.matrix <- unique(dir.exp.matrix)
+ dir.exp <- verify.dir.exp(recdata, outcome, conditions, noflevels, dir.exp)
+ EClist <- .Call("C_getEC", dir.exp, c.sol$expressions, c.sol$sol.matrix, p.sol$expressions, p.sol$sol.matrix, output$SA, PACKAGE = "QCA")
+ for (c.s in seq(ncol(c.sol$sol.matrix))) {
+ for (p.s in seq(ncol(p.sol$sol.matrix))) {
names(i.sol)[index] <- paste("C", c.s, "P", p.s, sep = "")
- EC <- subcols <- sexpr <- matrix(ncol = length(conditions), nrow = 0)
- colnames(EC) <- colnames(inputt)
- if (nrow(dir.exp.matrix) > 0) {
- for (dir.exp.i in seq(nrow(dir.exp.matrix))) {
- dir.exp.x <- dir.exp.matrix[dir.exp.i, ]
- subset.columns <- dir.exp.x > 0
- if (!is.null(output$SA[[p.s]])) {
- SArows <- apply(output$SA[[p.s]] + 1, 1, function(x) {
- return(all(x[subset.columns] == dir.exp.x[subset.columns]))
- })
- EC <- rbind(EC, output$SA[[p.s]][SArows, , drop = FALSE])
- }
- }
- }
- if (nrow(EC) > 0) {
- EC <- EC[order(rownames(EC)), , drop = FALSE]
- }
- i.sol[[index]]$EC <- unique(EC)
- i.sol[[index]]$DC <- output$SA[[p.s]][setdiff(rownames(output$SA[[p.s]]), rownames(EC)), , drop = FALSE]
- i.sol[[index]]$NSEC <- matrix(ncol = ncol(EC), nrow = 0)
- colnames(i.sol[[index]]$NSEC) <- colnames(EC)
+ i.sol[[index]]$EC <- EClist[[index]]
+ i.sol[[index]]$DC <- output$SA[[p.s]][setdiff(rownames(output$SA[[p.s]]), rownames(EClist[[index]])), , drop = FALSE]
+ i.sol[[index]]$NSEC <- matrix(ncol = ncol(EClist[[index]]), nrow = 0)
+ colnames(i.sol[[index]]$NSEC) <- colnames(EClist[[index]])
nsecs <- TRUE
while (nsecs) {
pos.matrix.i.sol <- unique(rbind(pos.matrix, i.sol[[index]]$EC + 1))
@@ -601,6 +522,7 @@
}
output$i.sol <- i.sol
}
+ names(output$SA) <- paste("M", prettyNums, sep = "")
output$SA <- lapply(output$SA, as.data.frame)
}
if (any(names(output) == "i.sol")) {
Modified: pkg/R/solveChart.R
===================================================================
--- pkg/R/solveChart.R 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/R/solveChart.R 2018-11-05 20:12:53 UTC (rev 59)
@@ -58,5 +58,7 @@
output <- t(output)
}
}
- return(matrix(row.numbers[output], nrow=nrow(output)))
+ output <- matrix(as.integer(row.numbers[output]), nrow = nrow(output))
+ output[is.na(output)] <- 0L
+ return(output)
}
Modified: pkg/R/sop.R
===================================================================
--- pkg/R/sop.R 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/R/sop.R 2018-11-05 20:12:53 UTC (rev 59)
@@ -154,7 +154,7 @@
if (identical(bl, "")) {
return(bl)
}
- bl <- translate(bl, snames = snames, noflevels = noflevels)
+ bl <- translate(gsub("\\*\\,", "+", bl), snames = snames, noflevels = noflevels)
expressions <- matrix(nrow = 0, ncol = ncol(bl))
for (i in seq(nrow(bl))) {
expressions <- rbind(expressions, as.matrix(expand.grid(lapply(bl[i, ], function(x) {
Modified: pkg/R/verifyQCA.R
===================================================================
--- pkg/R/verifyQCA.R 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/R/verifyQCA.R 2018-11-05 20:12:53 UTC (rev 59)
@@ -239,35 +239,20 @@
}
}
`verify.dir.exp` <-
-function(data, outcome, conditions, dir.exp = "") {
+function(data, outcome, conditions, noflevels, dir.exp = "") {
if (identical(dir.exp, "")) {
return(dir.exp)
}
else {
- delc <- list()
- baselist <- vector(mode = "list", length = length(conditions))
- names(baselist) <- conditions
- for (i in seq(length(conditions))) {
- values <- sort(unique(data[, conditions[i]]))
- if (is.factor(values)) {
- values <- as.character(values)
- }
- values <- setdiff(values, c("-", "dc", "?"))
- if (!possibleNumeric(values)) {
- cat("\n")
- stop(simpleError("Data contains non-numerical values.\n\n"))
- }
- values <- asNumeric(values)
- max.value <- ifelse(any(values %% 1 > 0), 1, max(values))
- baselist[[i]] <- logical(max.value + 1)
+ if (is.character(dir.exp)) {
+ dir.exp <- gsub(dashes(), "-", dir.exp)
}
- if (length(dir.exp) == 1 & is.character(dir.exp)) {
- dir.exp <- splitstr(dir.exp)
- }
- checkway <- unlist(strsplit(gsub("-|;", "", dir.exp), split = ""))
- oldway <- possibleNumeric(checkway) | length(checkway) == 0
- if (oldway) {
- delc$IDE <- baselist
+ oldway <- unlist(strsplit(gsub("[-|;|,|[:space:]]", "", dir.exp), split = ""))
+ if (possibleNumeric(oldway) | length(oldway) == 0) {
+ if (length(dir.exp) == 1) {
+ dir.exp <- splitstr(dir.exp)
+ }
+ expression <- NULL
if (length(dir.exp) != length(conditions)) {
cat("\n")
stop(simpleError("Number of expectations does not match number of conditions.\n\n"))
@@ -290,47 +275,31 @@
}
for (i in seq(length(del))) {
values <- del[[i]]
- if (!all(is.element(values, c("-", "dc")))) {
- values <- asNumeric(setdiff(values, c("-", "dc")))
- if (length(setdiff(values, seq(length(delc$IDE[[i]])) - 1) > 0)) {
+ if (any(values != "-")) {
+ values <- asNumeric(setdiff(values, "-"))
+ if (length(setdiff(values, seq(noflevels[i]) - 1)) > 0) {
cat("\n")
errmessage <- paste("Values specified in the directional expectations do not appear in the data, for condition \"", conditions[i], "\".\n\n", sep="")
stop(simpleError(paste(strwrap(errmessage, exdent = 7), collapse = "\n", sep="")))
}
else {
- delc$IDE[[i]][values + 1] <- TRUE
+ expression <- c(expression, paste(conditions[i], "{", paste(values, collapse = ","), "}", sep = ""))
}
}
}
- return(delc)
+ dir.exp <- expression
}
- else {
- noflevels <- getInfo(data, conditions, outcome)$noflevels
- dem <- translate(sop(paste(dir.exp, collapse = "+"), snames = conditions, noflevels = noflevels), snames = conditions, noflevels = noflevels)
- checkdem <- unname(apply(dem, 1, function(x) sum(x >= 0)))
- ide <- which(checkdem == 1)
- cde <- which(checkdem > 1)
- if (length(ide) > 0) {
- delc$IDE <- baselist
- for (i in seq(length(ide))) {
- demi <- asNumeric(dem[ide[i], ])
- wdem <- which(demi >= 0)
- delc$IDE[[wdem]][demi[wdem] + 1] <- TRUE
- }
+ dir.exp <- paste(dir.exp, collapse = "+")
+ if (!grepl("[{|}]", dir.exp)) {
+ if (any(noflevels > 2)) {
+ cat("\n")
+ stop(simpleError("For multivalue data, directional expectations should be specified using curly brackets.\n\n"))
}
- if (length(cde) > 0) {
- delc$CDE <- list()
- for (i in seq(length(cde))) {
- delc$CDE[[i]] <- baselist
- demi <- asNumeric(dem[cde[i], ])
- wdem <- which(demi >= 0)
- for (j in seq(length(wdem))) {
- delc$CDE[[i]][[wdem[j]]][demi[wdem[j]] + 1] <- TRUE
- }
- }
- }
+ dir.exp <- splitstr(dir.exp)
}
- return(delc)
+ dir.exp <- sop(dir.exp, snames = conditions, noflevels = noflevels)
+ dir.exp <- translate(dir.exp, snames = conditions, noflevels = noflevels)
+ return(matrix(as.integer(dir.exp) + 1L, ncol = ncol(dir.exp)))
}
}
`verify.mqca` <-
Modified: pkg/inst/ChangeLog
===================================================================
--- pkg/inst/ChangeLog 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/ChangeLog 2018-11-05 20:12:53 UTC (rev 59)
@@ -1,17 +1,21 @@
Version 3.4
+ o New: conjunctural directional expectations finally implemented
+ (thanks to Carsten Schneider for the persistence)
o New: function findRows() gains a new three dots argument "..." to
allow passing a combination of cutoff values to function truthTable()
- when negating the outcome
+ for the negation of the outcome
o New: function truthTable() gains a new argument called "pri.cut"
o Improved: function superSubset() gives a better error message when
no combinations are left given all cutoff values, including ron.cut and
pri.cut (thanks to Carsten Schneider for the suggestions)
o Improved: function sop() now able to solve further simplifications
- such as "A + ~AB" into "A + B" (via "A + AB + ~AB")
+ such as A + ~AB into A + B (via A + AB + ~AB)
o Improved: uniform QMC solutions from all minimization methods, with
no negative configurations, and including remainders
o Improved: function pofind() now accepts multivalue data
(thanks to Hanieh Moshki for the suggestion)
+ o Fixed: long overdue bug that failed to identify all easy counterfactuals
+ for certain types of directional expectations
o Fixed: bug in printing the cases, when they contain multi-byte
characters (thanks to Stefan Verweij for the report)
o Changed: all C level functions are now renamed using a "C_" prefix,
Modified: pkg/inst/gui/www/js/maincode.js
===================================================================
--- pkg/inst/gui/www/js/maincode.js 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/gui/www/js/maincode.js 2018-11-05 20:12:53 UTC (rev 59)
@@ -7095,7 +7095,7 @@
else {
createDialog(settings["about"]);
var messages = [
- "R package: QCA, version 3.3-3",
+ "R package: QCA, version 3.3-5",
"",
"Author: Adrian Dușa (dusa.adrian at unibuc.ro)",
"Former coauthors:",
Modified: pkg/inst/staticdocs/CV.html
===================================================================
--- pkg/inst/staticdocs/CV.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/CV.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>_Cebotari and Vink. QCA 3.3-3</title>
+<title>_Cebotari and Vink. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="">
@@ -32,7 +32,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/LegacyDatasets.html
===================================================================
--- pkg/inst/staticdocs/LegacyDatasets.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/LegacyDatasets.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>_Legacy datasets. QCA 3.3-3</title>
+<title>_Legacy datasets. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="">
@@ -32,7 +32,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/Lipset.html
===================================================================
--- pkg/inst/staticdocs/Lipset.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/Lipset.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>_Lipset. QCA 3.3-3</title>
+<title>_Lipset. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="">
@@ -32,7 +32,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/QCA.package.html
===================================================================
--- pkg/inst/staticdocs/QCA.package.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/QCA.package.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>QCA 3.3-3</title>
+<title>QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
@@ -42,7 +42,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
@@ -118,10 +118,10 @@
</tr><tr><td> Package</td>
</tr><tr><td>
Version: </td>
-</tr><tr><td> 3.3-3 </td>
+</tr><tr><td> 3.3-5 </td>
</tr><tr><td>
Date: </td>
-</tr><tr><td> 2018-11-02 </td>
+</tr><tr><td> 2018-11-05 </td>
</tr><tr><td>
License: </td>
</tr><tr><td> GPL (>= 2)</td>
Modified: pkg/inst/staticdocs/RS.html
===================================================================
--- pkg/inst/staticdocs/RS.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/RS.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>_Ragin and Strand. QCA 3.3-3</title>
+<title>_Ragin and Strand. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="">
@@ -32,7 +32,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/SOPexpression.html
===================================================================
--- pkg/inst/staticdocs/SOPexpression.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/SOPexpression.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>translate, compute, findRows, sop. QCA 3.3-3</title>
+<title>translate, compute, findRows, sop. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/XYplot.html
===================================================================
--- pkg/inst/staticdocs/XYplot.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/XYplot.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>XYplot. QCA 3.3-3</title>
+<title>XYplot. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/Xplot.html
===================================================================
--- pkg/inst/staticdocs/Xplot.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/Xplot.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>Xplot. QCA 3.3-3</title>
+<title>Xplot. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/calibrate.html
===================================================================
--- pkg/inst/staticdocs/calibrate.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/calibrate.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>calibrate. QCA 3.3-3</title>
+<title>calibrate. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/causalChain.html
===================================================================
--- pkg/inst/staticdocs/causalChain.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/causalChain.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>causalChain. QCA 3.3-3</title>
+<title>causalChain. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/chartFunctions.html
===================================================================
--- pkg/inst/staticdocs/chartFunctions.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/chartFunctions.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>PI chart functions: makeChart, findmin, solveChart. QCA 3.3-3</title>
+<title>PI chart functions: makeChart, findmin, solveChart. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/export.html
===================================================================
--- pkg/inst/staticdocs/export.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/export.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>export. QCA 3.3-3</title>
+<title>export. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/factorize.html
===================================================================
--- pkg/inst/staticdocs/factorize.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/factorize.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>factorize. QCA 3.3-3</title>
+<title>factorize. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/findRows.html
===================================================================
--- pkg/inst/staticdocs/findRows.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/findRows.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>findRows. QCA 3.3-3</title>
+<title>findRows. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/findTh.html
===================================================================
--- pkg/inst/staticdocs/findTh.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/findTh.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>findTh. QCA 3.3-3</title>
+<title>findTh. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/fuzzyops.html
===================================================================
--- pkg/inst/staticdocs/fuzzyops.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/fuzzyops.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>fuzzyand, fuzzyor. QCA 3.3-3</title>
+<title>fuzzyand, fuzzyor. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/implicantMatrixFunctions.html
===================================================================
--- pkg/inst/staticdocs/implicantMatrixFunctions.html 2018-11-01 23:21:49 UTC (rev 58)
+++ pkg/inst/staticdocs/implicantMatrixFunctions.html 2018-11-05 20:12:53 UTC (rev 59)
@@ -2,7 +2,7 @@
<html lang="en">
<head>
<meta charset="utf-8">
-<title>Implicant matrix functions: allExpressions, createMatrix, getRow. QCA 3.3-3</title>
+<title>Implicant matrix functions: allExpressions, createMatrix, getRow. QCA 3.3-5</title>
<meta name="viewport" content="width=device-width, initial-scale=1.0">
<meta name="author" content="
Adrian Dusa
@@ -34,7 +34,7 @@
<div class="navbar">
<div class="navbar-inner">
<div class="container">
- <a class="brand" href="#">QCA 3.3-3</a>
+ <a class="brand" href="#">QCA 3.3-5</a>
<div class="nav">
<ul class="nav">
<li><a href="index.html"><i class="icon-home icon-white"></i> Index</a></li>
Modified: pkg/inst/staticdocs/index.html
===================================================================
--- pkg/inst/staticdocs/index.html 2018-11-01 23:21:49 UTC (rev 58)
[TRUNCATED]
To get the complete diff run:
svnlook diff /svnroot/qca -r 59
More information about the Qca-commits
mailing list