search for: splus2r

Displaying 15 results from an estimated 15 matches for "splus2r".

Did you mean: splus
2009 Oct 07
1
inconsistency in return value of peaks() {splus2R} (PR#13988)
Full_Name: Benny van der Vijgh Version: 2.7.2 OS: Windows Vista Submission from: (NULL) (194.171.252.108) The return value of peaks() in package splus2R is not consistent. This is because of the call to max.col() without additional parameters which peaks() makes. max.col() has a parameter 'ties.method' which specifies how ties are handled, with "random" by default. This means that when peaks() is called on a vector with two (or...
2011 May 01
2
Question on where samples are grouped in rmvnorm{mvtnorm}
Dear All, For function: rmvnorm{mvtnorm} in (library mvtnorm, not splus2R), if I generate 2 bivariate normal samples as follows: > rmvnorm(2,mean=rep(0,2),sigma=diag(2)) [,1] [,2] [1,] 2.0749459 1.4932752 [2,] -0.9886333 0.3832266 Where is the first sample, it is stored in the first row or the first column? Does this function store samples row-wise o...
2012 Sep 27
2
Generating an autocorrelated binary variable
...0.2. Furthermore, the overall probability to get either outcome of the binary variable should be 0.5. Below you can see the R code (I use for simplicity a diagonal matrix in rmvnorm even if it produces no correlated sample): "sampleCop" <- function(n = 1000, rho = 0.2) { require(splus2R) mvrs <- rmvnorm(n + 1, mean = rep(0, 3), cov = diag(3)) pmvrs <- pnorm(mvrs, 0, 1) var1 <- matrix(0, nrow = n + 1, ncol = 1) var1[1] <- qbinom(pmvrs[1, 1], 1, 0.5) if(var1[1] == 0) var1[nrow(mvrs)] <- -1 for(i in 1:(nrow(pmvrs) - 1)) { if(pmvrs[i + 1, 1] <= rho) var1[i +...
2008 May 29
1
help (using ?) does not handle trailing whitespace (PR#11537)
...=C;LC_COLLATE=C;LC_MONETARY=C;LC_MESSAGES=en_US;LC_PAPER=en_US;LC_NAME=C;LC_ADDRESS=C;LC_TELEPHONE=C;LC_MEASUREMENT=en_US;LC_IDENTIFICATION=C Search Path: .GlobalEnv, package:stats, package:graphics, package:grDevices, package:utils, package:datasets, package:showStructure, package:Rcode, package:splus2R, package:methods, Autoloads, package:base
2008 May 30
2
scoping problem when calling lm(precomputed formula, weights) from function (PR#11540)
...=C;LC_COLLATE=C;LC_MONETARY=C;LC_MESSAGES=en_US;LC_PAPER=en_US;LC_NAME=C;LC_ADDRESS=C;LC_TELEPHONE=C;LC_MEASUREMENT=en_US;LC_IDENTIFICATION=C Search Path: .GlobalEnv, package:stats, package:graphics, package:grDevices, package:utils, package:datasets, package:showStructure, package:Rcode, package:splus2R, package:methods, Autoloads, package:base
2008 Aug 22
1
save() should not overwrite a file if an error occurs (PR#12583)
...SSAGES=en_US;LC_PAPER=en_US;LC_NAME=C;LC_ADDRESS=C;LC_TELEPHONE=C;LC_MEASUREMENT=en_US;LC_IDENTIFICATION=C Search Path: .GlobalEnv, package:Rfixes, package:Rcode, package:aggregate, package:stats, package:graphics, package:grDevices, package:utils, package:datasets, package:showStructure, package:splus2R, package:methods, Autoloads, package:base [[alternative HTML version deleted]]
2008 Jun 10
0
browser() exits when not desired, in three different scenarios (PR#11623)
...=C;LC_COLLATE=C;LC_MONETARY=C;LC_MESSAGES=en_US;LC_PAPER=en_US;LC_NAME=C;LC_ADDRESS=C;LC_TELEPHONE=C;LC_MEASUREMENT=en_US;LC_IDENTIFICATION=C Search Path: .GlobalEnv, package:stats, package:graphics, package:grDevices, package:utils, package:datasets, package:showStructure, package:Rcode, package:splus2R, package:methods, Autoloads, package:base [[alternative HTML version deleted]]
2008 Aug 18
2
ifelse
I find it slightly surprising, that ifelse(TRUE, character(0), "") returns NA instead of character(0). [WNT 2.6.2 Patched] -- Heikki Kaskelma
2008 Jun 11
0
[ESS] browser() exits when not desired, in three different scenarios (PR#11634)
...ARY=C;LC_MESSAGES=en_US;LC_PAPER=en_US;LC_NAME=C;LC_ADDRESS=C;LC_TELEPHONE=C;LC_MEASUREMENT=en_US;LC_IDENTIFICATION=C > > Search Path: > .GlobalEnv, package:stats, package:graphics, package:grDevices, > package:utils, package:datasets, package:showStructure, package:Rcode, > package:splus2R, package:methods, Autoloads, package:base > > [[alternative HTML version deleted]] > > ______________________________________________ > ESS-help at stat.math.ethz.ch mailing list > https://stat.ethz.ch/mailman/listinfo/ess-help >
2008 May 30
0
scoping problem when calling lm(precomputed formula, weights) (PR#11543)
...;LC_MONETARY=C;LC_MESSAGES=en_US;LC_PAPER=en_US;LC_NAME=C;LC_ADDRESS=C;LC_TELEPHONE=C;LC_MEASUREMENT=en_US;LC_IDENTIFICATION=C > > Search Path: > .GlobalEnv, package:stats, package:graphics, package:grDevices, package:utils, package:datasets, package:showStructure, package:Rcode, package:splus2R, package:methods, Autoloads, package:base > > ______________________________________________ > R-devel at r-project.org mailing list > https://stat.ethz.ch/mailman/listinfo/r-devel
2008 Jun 02
0
(PR#11537) help (using ?) does not handle trailing whitespace
...MEASUREMENT=en_US;LC_IDENTIFICATION=C >>>> >>>> Search Path: >>>> .GlobalEnv, package:stats, package:graphics, package:grDevices, >>>> package:utils, package:datasets, package:showStructure, package:Rcode, >>>> package:splus2R, package:methods, Autoloads, package:base >>>> >>>> ______________________________________________ >>>> R-devel at r-project.org mailing list >>>> https://stat.ethz.ch/mailman/listinfo/r-devel >>>> >>>...
2008 Feb 21
3
applying a function to data frame columns
useR's, I want to apply this function to the columns of a data frame: u[u >= range(v)[1] & u <= range(v)[2]] where u is the n column data frame under consideration and v is a data frame of values with the same number of columns as u. For example, v1 <- c(1,2,3) v2 <- c(3,4,5) v3 <- c(2,3,4) v <- as.data.frame(cbind(v1,v2,v3)) uk1 <- seq(min(v1) - .5, max(v1) + .5,
2008 Jul 01
1
[.data.frame speedup
Below is a version of [.data.frame that is faster for subscripting rows of large data frames; it avoids calling duplicated(rows) if there is no need to check for duplicate row names, when: i is logical attr(x, "dup.row.names") is not NULL (S+ compatibility) i is numeric and negative i is strictly increasing "[.data.frame" <- function (x, i, j,
2010 Aug 25
1
Documenting S4 Methods
I'm in the process of converting some S3 methods to S4 methods. I have this function : setGeneric("enrichmentCalc", function(rs, organism, seqLen, ...){standardGeneric("enrichmentCalc")}) setMethod("enrichmentCalc", c("GenomeDataList", "BSgenome"), function(rs, organism, seqLen, ...) { ... ... ... })
2012 Apr 15
6
CRAN (and crantastic) updates this week
...1.1), RDieHarder (0.1.2), rEMM (1.0-5), reweight (1.2.1), rockchalk (1.5.4), rrBLUP (3.7), rrcovNA (0.4-03), RRF (1.2), RXMCDA (1.4.2), scriptests (1.0-9), sdcMicro (3.1.1), SDMTools (1.1-11), seewave (1.6.3), sem (3.0-0), SGP (0.9-0.0), SkewHyperbolic (0.3-1), SpatialTools (0.3.5), sphet (1.1-12), splus2R (1.1-1), STAR (0.3-5), tmvtnorm (1.4-6), track (1.0-15), VarianceGamma (0.3-1), VBmix (0.2.7), verification (1.32), VGAM (0.8-7), vines (1.0.4), x12 (1.0-1) This email provided as a service for the R community by http://crantastic.org. Like it? Hate it? Please let us know: cranatic at gmail.c...