search for: tval

Displaying 20 results from an estimated 49 matches for "tval".

Did you mean: _val
2006 Jul 25
5
greek letters, text, and values in labels
Hello, I want to have a title that will look something like: "Results for \theta=2.1", given that I have a variable theta=2.1, and \theta should show on the screen like the greek letter. I've tried a lot of things: theta <- 2.1 plot(1:10, main=expression(paste("Results for", theta, "=", eval(theta)))) or using bquote plot(1:10, main=paste("Results for
1997 Nov 24
0
R-alpha: random number generator -- S-plus's
...39; '(text)' sed 's/^X//' << 'SHAR_EOF' > 'runif-tst.S' && ##SunOS4: print(dyn.load2("/u/maechler/C/C-for-S/Runif.o")) print(dyn.load("/u/maechler/C/C-for-S/Runif.o")) X.C("Init_seed", X Cval = as.integer(12345), X Tval = as.integer(987654321)) str(.C("Get_seed", Cval = integer(1), Tval = integer(1))) X rU_ numeric(10) for(i in 1:10) rU[i] <- unlist(.C("Runif", numeric(1))) rU str(.C("Get_seed", Cval = integer(1), Tval = integer(1))) X Set.seed <- function(Cval = 12345, Tval =98...
2003 May 30
2
Extracting Vectors from Lists of Lists Produced by Functions
...using loops anyway to extract the vectors I want. I would appreciate it if someone could show me how to avoid these loops. Thanks. EXAMPLE: noise<-matrix(data = rnorm(15, mean=0, sd=1), nrow = 5, ncol = 3, byrow = FALSE, dimnames = NULL) measure<-apply(noise,2,t.test) measure tval<-NULL df<-NULL pval<-NULL for (i in 1:length(measure)){ tval[i]<-measure[[i]][[1]] df[i]<-measure[[i]][[2]] pval[i]<-measure[[i]][[3]]} data.frame(tval,df,pval) Charles E. White, Biostatistician Walter Reed Army Institute of Research 503 Robert Grant Ave., Room 1w102 Silver...
2008 Sep 12
1
Error in solve.default(Hessian) : system is computationally singular
...(i in 2:n){ hh[i]<-alpha0+alpha*(x[i-1]-r+0.5*hh[i-1])^2+beta*hh[i-1] } hh<-ts(hh) h<-sqrt(abs(hh)) z<-(x-r+0.5*hh)/h -(-(sum(0.5*(log(hh[2:n])+(z[2:n])^2)))) } fit<-nlminb(param, llh, lower=lowerB, upper=upperB) Hessian<-hessian(llh,fit$par) se.coef = sqrt(diag(solve(Hessian))) tval = fit$par/se.coef matcoef = cbind(fit$par,se.coef, tval, 2*(1-pnorm(abs(tval)))) dimnames(matcoef) = list(names(tval), c(" Estimate", " Std. Error", " t value", "Pr(>|t|)")) printCoefmat(matcoef, digits = 6, signif.stars = TRUE) }
2008 Aug 07
1
dput function (PR#12112)
Full_Name: Juan Gea Version: R version 2.6.2 OS: Fedora Core 6 Submission from: (NULL) (79.153.48.49) Abort: objeS <- matrix("AAA",1000000) class(objeS) outTxt <- textConnection("vaClob", open = "w", local = FALSE) dput(objeS,outTxt) close(outTxt) R version 2.6.2 (2008-02-08) Copyright (C) 2008 The R Foundation for Statistical Computing ISBN
2024 Mar 01
2
dput(..., file = stderr())
Curious to know if this warning is expected behavior, and if so, what is the recommended way instead: > dput(letters, file = stderr()) c("a", "b", "c", "d", "e", "f", "g", "h", "i", "j", "k", "l", "m", "n", "o", "p",
2011 May 06
1
How to alter circle size
...s, at = pretty(z), scale = 0.8, ...) { require("grid", quietly = TRUE) x <- as.numeric(x)[subscripts] y <- as.numeric(y)[subscripts] z <- as.numeric(z)[subscripts] zcol <- level.colors(z, at = at, ...) for (i in seq(along = z)) { lims <- range(0, z[i]) tval <- 2 * base::pi * seq(from = lims[1], to = lims[2], by = 0.01) grid.polygon(x = x[i] + .5 * scale * c(0, sin(tval)), y = y[i] + .5 * scale * c(0, cos(tval)), default.units = "native", gp = gpar(fill = zcol[i])) grid.circle(x = x[i], y = y[i], r = .5 * scale,...
2008 Sep 12
2
[LLVMdev] Selection Condition Codes
...isSameAs<0, 2>, SDTCisSameAs<0, 3> ]>; def cmov_logical : SDNode<"INSTISD::CMOVLOG", SDTGenTernaryOp>; let PrintMethod = "printCCOperand" in def CCOp : Operand<i32>; def CMOVLOG : InstFormat<(outs GPR:$dst), (ins GPR:$LHS, GPR:$RHS, GPR:$TVAL, GPR:$FVAL, CCOp:$cond), "$cond $LHS, $LHS, $RHS\ncmov_logical $dst, $LHS, $TVAL, $FVAL", [(set GPR:$dst, (selectcc GPR:$LHS, GPR:$RHS, GPR:$TVAL, GPR:$FVAL, CCOp:$cond))]>; Maybe I'm approaching this from the wr...
2013 Feb 14
2
Plotting survival curves after multiple imputation
...= ubar, b = b, t = t, r = r, df = df, f = f) return(fit) } summary.impute <- function(object){ if (!is.null(object$call1)){ cat("Call: ") dput(object$call1) } est <- object$qbar se <- sqrt(diag(object$t)) tval <- est/se df <- object$df pval <- 2 * pt(abs(tval), df, lower.tail = FALSE) coefmat <- cbind(est, se, tval, pval) colnames(coefmat) <- c("Estimate", "Std. Error", "t value", "Pr(&...
2011 Jul 08
1
Confused about a warning message
I define the following function to convert a t-value with degrees of freedom DF to another t-value with different degrees of freedom fullDF: tConvert <- function(tval, DF, fullDF) ifelse(DF>=1, qt(pt(tval, DF), fullDF), 0) It works as expected with the following case: > tConvert(c(2,3), c(10,12), 12) [1] 1.961905 3.000000 However, it gives me warning for the example below although the output is still as intended: > tConvert(c(2,3), c(0,12), 12) [1]...
1999 May 18
0
A typo bug in Samba 2.0.4 source code (here's the fix!)
...ng tv_usec; /* and microseconds */ }; # endif /* _STRUCT_TIMEVAL */ .. Here's the fix: diff -u system.c.org system.c --- system.c.org Tue May 18 12:49:52 1999 +++ system.c Tue May 18 12:50:20 1999 @@ -166,8 +166,8 @@ /* * Fake it with select... */ - tval.tv_secs = 0; - tval_tv_usecs = usecs/1000; + tval.tv_sec = 0; + tval.tv_usec = usecs/1000; select(0,NULL,NULL,NULL,&tval); return 0; #endif /* HAVE_USLEEP */ In HPUX 10.20's compilation there are lots of warnings: cpp: "values.h", line 27: warning 2001: Redefinition of...
2008 Mar 21
0
How to Package Extra Results to summary.lm
...ue. 2) The stars that would previously indicate the significance of the coefficients no longer show up, and neither does the legend that explains the stars on the bottom. 3) I get a warning message at the bottom of the output saying the following: "Warning message: In cbind(betas, est, se, tval, 2 * pt(abs(tval), rdf, lower.tail = FALSE), : number of rows of result is not a multiple of vector length (arg 1)" In order to give you a 'paper trail', following are the new functions I defined, the url linking you to my summary2 script and a dataset I've been using to te...
2011 Jul 09
1
[LLVMdev] getting and setting array indices c interface
...SymbolTable(*array\name) arrptr = LLVMBuildLoad(Builder,arr,"arrayptr") tmp = LLVMBuildGEP(Builder,arrptr,index,0,"ptr") ptr = llvmBuildload(Builder,tmp,"ele") and to set tarr = *fn\SymbolTable(*array\name) Arr = LLVMBuildLoad(builder,tarr,"array") tval = *fn\SymbolTable(*value\name) val = LLVMBuildLoad(builder,tval,"val") tindex = *fn\SymbolTable(*index\name) index = LLVMBuildLoad(builder,tindex,"index") ptr = LLVMBuildGEP(builder,Arr,index,0,"ptr") LLVMBuildStore(builder,val,ptr) All seems to results in is ge...
2008 Mar 28
1
Device problems in a loop.
...39;NE','NEBC') grp <- as.factor(rep(grp, each=200)) bwplot(c(data)~grp, ylab='MSE', pch=19, par.settings = list(plot.symbol = list(pch = "+")), main=eval(substitute(expression(paste(' ', delta[phi[1]], " = ", tval, ' | ', delta[phi[2]], ' = ', tval2, ' | ', delta[theta[1]], ' = ', tval3, ' | ', delta[theta[2]], ' = ', tval4,)), list(tval=A, tval2=B, tval3=C, tval4=D)))) dev.print(file=filenameplot[i], device=png, width...
2009 Jul 08
1
functions to calculate t-stats, etc. for lm.fit objects?
I'm running a huge number of regressions in a loop, so I tried lm.fit for a speedup. However, I would like to be able to calculate the t-stats for the coefficients. Does anyone have some functions for calculating the regression summary stats of an lm.fit object? Thanks, Whit
1999 May 18
0
Probleme compiling Samba 2.0.4
...les compiling but I have an error with the /source/lib/system.c file. It is concerning the timeval struct (which I concluded must be a system struct) at lines 169 and 170. It looks like a copy and paste error but the code is too big and I haven't looked it all... My solution would be to change tval.tv_secs = 0; tval_tv_usec = usecs/1000; To the following : tval.tv_sec = 0; tval.tv_usec = usecs/1000; Is this right??? I have another problem, I try to configure our network so NT, Win95-98 and Win3.1 users can map Unix server drives to their desktops without having to enter their passwords a...
2014 Jan 06
1
Signif. codes
My question is about the "Signif. codes" , the output when I run matcoef =cbind(fit$par, se.coef,tval,2*(1-pnorm(abs(tval)))) dimnames(matcoef)=list(names(tval),c("Estimate","Std.Error","t value","pr(>|t|)")) cat("\nCoefficient(s):\n") printCoefmat(matcoef, digits=4, signif.stars = TRUE) Coefficient(s): Estimate Std.Error t value pr(...
2004 Apr 05
1
normalized regression output
...tputs normalized coefficients ( coef(x)*sdv(x)/sdv(y) ). now, a formula is an object, and I cannot see how to extract the variables for obtaining sdv's. the intent is to write something like my.print.lm( formula ) { model <- lm(formula); coefs <- (t(summary.lm(model)))[1,]; tvals <- (t(summary.lm(model)))[3,]; for (i in 1:length( formula.contents.length ) ) { normcoefs[i] <- coefs[i]*sd( formula.coef[i] ) /sd( formula.yvar ); } # now I can do nice printing } my.print.lm ( y~x+z ); or something like it. If this is not easy, please just tell me. I...
2008 Jan 03
2
confidence interval too small in nlme?
Hello, I am interested in using nlme to model repeated measurements, but I don't seem to get good CIs. With the code below I tried to generate data sets according to the model given by equations (1.4) and (1.5) on pages 7 and 8 of Pinheiro and Bates 2000 (having chosen values for beta, sigma.b and sigma similar to those estimated in the text). For each data set I used lme() to fit a model,
2011 Jan 25
1
[RFC] Updates to ACP smart driver
This patch introduces a handful of new options, I mentioned earlier in: http://www.mail-archive.com/nut-upsdev at lists.alioth.debian.org/msg02088.html See the large commit message in the follow-up for the details and rationale. I realize it's a bit larger diff - so if it's required I can split it into few smaller ones. Michal Soltys (1): APC smart driver update and new features.