Displaying 7 results from an estimated 7 matches for "ccov".
Did you mean:
cov
2010 Jul 19
1
Calculation of Covariance Matrix Calculation
Hi,
Excuse me for asking this silly question. But I really couldn't understand
why cov() and ccov() don't work for my calculation of covariance matrix.
a <- matrix(1:8, 2, 4)
a
[,1] [,2] [,3] [,4]
[1,] 1 3 5 7
[2,] 2 4 6 8
> ccov(a)
Error in solve.default(cov, ...) :
Lapack routine dgesv: system is exactly singular
I also tried colume bind, but it still...
1999 Nov 27
0
lme
...# random is ~ age
summary(fm2 <- lme(distance ~ age + Sex, data = Orthodont, random = ~ 1))
# set up data object
distance <- matrix(Orthodont[1],ncol=4,byrow=T)
age <- matrix(Orthodont[2],ncol=4,byrow=T)
sex <- Orthodont[4][seq(4,108,by=4)]
data <- rmna(restovec(distance,times=age),ccov=tcctomat(sex))
rm(Orthodont,age,sex,distance)
#model fm1
carma(data,torder=1,pre=rep(1,3),pos=rbind(c(1,1),c(2,2),c(1,2)))
# uncorrelated random coefficients
carma(data,torder=1,pre=rep(1,2),pos=rbind(c(1,1),c(2,2)))
#model fm2
carma(data,ccov=~sex,torder=1,pre=1,pos=c(1,1))
# random coefficient f...
2003 Oct 08
0
Bootstrap Question
...y help,
Art Nuzzo
Motorola
***************************************************************************************
library(bootstrap)
CImiss = function(M, lower, upper) {lower > M || upper < M }
CIr = function(lower, upper) {upper - lower}
C = c(); B = c() # CI Range
Ccov = 0; Bcov = 0 # Number of Ci Misses
cnt = 1000; # reps
x = rnorm(10000) # create population
m = mean(x)
for (i in 1:cnt) {
s = sample(x,10,replace=F) # sample population
tresults = t.test(s)
attach(tresults)
C[i] = CIr(conf.int[1],conf.int[2])
if (CImiss(m,conf.int[1],conf.int[2])) Ccov...
2015 May 06
2
[LLVMdev] LCOV per commit
Le 06/05/2015 21:05, Renato Golin a écrit :
> On 6 May 2015 at 19:15, Sanjoy Das <sanjoy at playingwithpointers.com> wrote:
>> I could not easily locate this on http://llvm.org/reports/coverage/ so
>> asking here: what workload is the coverage computed over? IOW, what
>> all does the bot run to get this coverage information?
> Nothing is clear in that page. No
1999 Nov 25
1
gnls
...matrix(Soybean[4][Soybean[1]==i])))
plot <- c(plot,Soybean[1][Soybean[1]==i][1])
variety <- c(variety,Soybean[2][Soybean[1]==i][1])
year <- c(year,Soybean[3][Soybean[1]==i][1])}
# unfortunately, category names of factor variables were lost here by c()
data <- rmna(restovec(soybean),
ccov=tcctomat(data.frame(plot,variety=variety-1,
year=as.factor(year)),dataframe=F))
# for discrete time AR(1)
#data <- rmna(restovec(soybean),
# ccov=tcctomat(data.frame(plot,variety=variety-1,
# year=as.factor(year)),dataframe=F),tvc=tvctomat(ctimes,name="ctimes"))
#rm(Soybean,soybean,pl...
2009 Jan 30
1
Methods not loaded in R-Devel vs 2.8.1
...model class.
License: GPL (>= 2)
LazyLoad: yes
LazyLoad: yes
NAMESPACE:
**********
## Import packages
import(methods)
## Import functions
importFrom(stats, coef, logLik, residuals)
## Classes
exportClasses(Goestml, GoGARCH, Goinit, Orthom)
## Methods
exportMethods(angles, cvar, ccor, ccov, coef, converged, goest, logLik, M, print, show, t, residuals)
## Functions
export(gogarch, goinit, gollh, gotheta, Rd2, UprodR, unvech, validOrthomObject, validGoinitObject)
Dr. Bernhard Pfaff
Director
Invesco Quantitative Strategies International
Invesco Asset Management Deutschland GmbH
Ble...
1999 Sep 16
1
MS executables for my libraries
An executable version 0.6 of my libraries is now available at
www.luc.ac.be/~jlindsey/rcode.html
This works with MS R0.64.2 and appears possibly to work with R65.0.
There is a serious problem with the Fortran compiler as some of the
examples for elliptic and carma crash it. These same examples do not crash
R63.0 with the library executables of Jan 99. I am releasing this anyway
because of the