search for: 0,2

Displaying 20 results from an estimated 391 matches for "0,2".

Did you mean: 0,0
2012 Jul 02
4
how to do a graph with tree different colors??
hi i try to do a graph of a time series which shows in red the values > -0.05, in blue the values >0.05 and in white the values between -0.05 and 0.05 for un exemple :http://www.appinsys.com/globalwarming/enso.htm thanks !!!!! denisse -- View this message in context: http://r.789695.n4.nabble.com/how-to-do-a-graph-with-tree-different-colors-tp4635206.html Sent from...
2012 Jul 02
4
R sub query
Hello, I would like to substitute a substring of characters defined by a specific start and end sequence. i.e. in the example matrix below, I would like to substitute ".:X:" with "", where X varies in sequence...   m<-matrix(c(".:0:0,0", ".:2:0,2", ".:194:193,1", ".:56:0,56", ".:58:50,8", ".:13:0,13",  ".:114:114,0", ".:75:75,0"), nrow=2)   output required:      [,1]      [,2]          [,3]        [,4]         [1,] "0,0" "193,1" &q...
2009 Feb 26
0
How do I retrieve column and row names after comparing two matrices?
Hello, I have two matrices as shown below: Matrix 1 ID AB1 BC1 CD1 ... name1 1,1 2,1 0,2 ... name2 2,0 1,2 1,2 ... name3 0,2 1,1 2,0 ... name4 2,0 0,2 0,2 ... Matrix 2 ID AB2 BC2 CD2 ... name1 1,1 2,1 0,2 ... name2 2,0...
2004 Aug 12
0
Xend, File Descriptors, and Children
...to xend. It turns out that xend doesn''t set the close-on-exec flag for most of its file descriptors, and so those descriptors are passed to all child processes. This means that my dhcpd process ends up looking like this (output from lsof): dhcpd3 766 root cwd DIR 8,1 4096 2 / dhcpd3 766 root rtd DIR 8,1 4096 2 / dhcpd3 766 root txt REG 8,1 604248 89841 /usr/sbin/dhcpd3 dhcpd3 766 root mem REG 8,1 90152 29553 /lib/ld-2.3.2.so dhcpd3 766 root mem REG 8,1 1243856 29446 /lib/libc-2.3.2....
2011 Aug 30
2
Multivariate Normal: Help wanted!
I have the following function, a MSE calc based on some Multivariate normals: MV.MSE<-function(n,EP,X,S){ (dmvnorm(X,mean=rep(0,2),I+S+EP)-dmvnorm(X,mean=rep(0,2),I+S))^2 + 1/n*(dmvnorm(X,mean=rep(0,2),1+S+EP/2)*det(4*pi*EP)^-.5- (dmvnorm(X,mean=rep(0,2),I+S+EP ))^2)} I can get the MV.MSE for given values of the function e.g MV.MSE(10,diag(0.5,2),c(.25,.25),diag(1,2)) But I would like to how MV....
2009 Apr 15
2
How to Reshuffle a distance object
...e one created by ade4{dist.binary} below. My first attempt, using sample(jc.dist) creates a shuffled vector, losing the lower triangular structure of the distance object. How can I Ishuffle the lower triangular part of a distance matrix without losing the structure? Thanks. --Dale x1 <- c(rep(0,4),1) x2 <- c(rep(0,2),rep(1,3)) x3 <- c(rep(1,3), rep(0,2)) X <- rbind(x1,x2,x3) X X <- as.data.frame(X) library(ade4) jc.dist? <- dist.binary(X, method=1) sample(jc.dist)
2005 Jan 04
3
AVM C2 capi.conf ?
...n the dmesg is only the capidrv-1 shown, no capidrv-2, only the isdnlog is shown the incoming call on the second port. Has anyone an usable (capi.conf?) configration ? Thx in advanced and regards, Andreas. -- appendix -- capidrv: Rev 1.1.2.2: loaded b1: revision 1.1.2.2 ACPI: PCI interrupt 0000:00:09.0[A] -> GSI 5 (level, low) -> IRQ 5 c4: PCI BIOS reports AVM-C2 at i/o 0xd000, irq 5, mem 0xe1000000 kcapi: Controller 1: c2-d000 attached kcapi: Controller 2: c2-d000 attached c4: AVM C2 at i/o 0xd000, irq 5, mem 0xe1000000 c4: revision 1.1.2.2 c2-d000: card 1 "C2" ready....
2007 Feb 04
4
Reading expressions from character vectors
...roblem that I am sure is very straightforward, but I just can't wrap my head around it. I've read the help pages on text, plotmath, expression, substitute, but somehow I can't find the answer to this simple question. Basically consider the following example: plot( NULL, xlim = c(0,2), ylim = c(0,2) ) expressions <- expression( -infinity, infinity ) text( c(0.5,1.5), 1.5, expressions ) labels <- c( "-infinity", "infinity" ) text( c(0.5,1.5), 0.5, as.expression(labels) ) I want the character vector "labels" to be interpreted as an expre...
2012 Jan 18
2
How do I exactly align the right hand side of "mtext" relative to a plot device? Beyond "adj".
...ardless of the length of the added text, or the values on the x-axis. Here's a simple example with two versions (the first three lines of each version are identical). I would like the right end of the added text to be the same distance from the legend in both versions. ### v1 dev.new() plot(c(0,1),c(0,1),ylim=c(0,2)) legend("topright",c("data1","data2"),col=c(1,2),lty=1,bty="n") mtext("text",side=3,line=-2,adj=0.8) ### v2 dev.new() plot(c(0,1),c(0,1),ylim=c(0,2)) legend("topright",c("data1","data2"),col=c(1,2...
2008 Aug 18
1
ARMA(0,2) & GARCH(1,1) - code & hessian
Hello R-list-members, I'm trying to model ARMA(0,2) & GARCH(1,1) process using the code below, but according to my textbook, the estimated parameters are wrong. The MA-parameters should be negative. (I've got the same problem using garchFit()). Can anyone tell me what I'm doing wrong? And how can I calculate the hessian matrix? Many...
2017 Aug 14
1
Some Unicode symbols are missing
Hi, I would like to draw some Unicode symbols like G- and f-clefs (used in music notation) in quartz-window. I succeed in producing sharp #,: plot(0,0,xlim=c(0,2),ylim=c(0,2)) points(1,1, pch="\u266F",cex=2) But for instance "b" (flat accidental) u266D and those clefs doesn't work. G-clef is said to be UTF-8: F0 9D 84 9E UTF-16: D834 DD1E Code point: U+1D11E I have loaded package extrafont and tried everything found...
2013 May 05
2
custom function that plots other functions- problem
...we do not know the exact number of functions the user will select to draw. The program is relatively easy with one function, f.e sin: mf<- function(f,range,quality){ x<- seq(range[1],range[2], quality); y<- f(x); plot(x,y); } mp(sin, c(0,2*pi), .02); but I encountered some problems while trying to provide more than one- the following structure generates mistakes: plotter<- function(f,howmany,range,quality){ x<-seq(range[1],range[2],quality) y<- matrix(f,how_many) plot(x,y[1,]) for(i in 2:how_many){ li...
2006 Mar 23
3
outer() function
...face of a function. If there is a better way to do this, I would appreciate the insight. Otherwise, could someone suggest a method to get the outer() function to work here? Below is my simplified R program. Further down is the output. Thanks in advance, Kyle ################### data <- c(0, 1, 2, 3) x <- c(0,2,4) y <- c(0,1,2) f <- function(x, y) sum(data*x)+y f(0,0); f(2,0); f(4,0); f(0,1); f(2,1); f(4,1); f(0,2); f(2,2); f(4,2); outer(x, y, f) f <- function(x, y) x-x+y-y+force(sum(data^x)) outer(x, y, f) ################################## > data <- c(...
2003 Nov 27
2
would like to know how to simulated a GARCH(1,2)
Follow the example in tseries, we can simulated a GARCH(0,2), n <- 1100 a <- c(0.1, 0.5, 0.2) # ARCH(2) coefficients e <- rnorm(n) x <- double(n) x[1:2] <- rnorm(2, sd = sqrt(a[1]/(1.0-a[2]-a[3]))) for(i in 3:n) # Generate ARCH(2) process { x[i] <- e[i]*sqrt(a[1]+a[2]*x[i-1]^2+a[3]*x[i-2]^2) } x <- ts(x[101:1100]) and x is a...
2017 Oct 09
1
Regular expression help
"(^| +)([^/ ]*/?){0,2}", with the first "*" replaced by "+" would be a bit better. Bill Dunlap TIBCO Software wdunlap tibco.com On Mon, Oct 9, 2017 at 8:50 AM, William Dunlap <wdunlap at tibco.com> wrote: > > x <- "f 147/1315/587 2820/1320/587 3624/1321/587 1852/1322/587...
2007 Mar 25
2
[LLVMdev] Live intervals and aliasing registers problem
...ginning to add vector registers to a back end I came across the following problem: as soon as I define two sets of registers that have a many-to-one mapping the live interval pass appears to double- kill the mapped-onto register. I have the following excerpts from my RegisterInfo.td. def V4R0 : R4v<0 , "V4R0 ", []>, DwarfRegNum<0>; def R0 : Rg<0 , "R0", [V4R0]>, DwarfRegNum<0>; def R1 : Rg<1 , "R1", [V4R0]>, DwarfRegNum<1>; when trying to compile: define void @_Z3fooii(i32 %a, i32 %b) { entry: %retval =...
2010 Feb 24
1
lme4 exactitud
...unque no es código r creo que se entendería Factores como ser casa y auto, tengo casa 1, casa 2, casa 3, y auto 1, auto2, auto 3. Con lme4 y utilizando ranef obtengo por ejemplo Casa 1 2 Casa 2 2,1 Casa 3 2 Auto 1 0,2 Auto 2 0,18 Auto 3 0,19 Supongamos que el valor de Casa 1 es el resultado de información de impuestos abonados durante 2 años. De la misma forma suponemos que el valor de Casa 2 es el resultado de información sobre impuestos abonados durante 1 año, porque...
2009 Sep 17
0
lpSolve constraints don't seem to have an effect
...n using lpSolve. My code runs without any error or warning message but the constraints that I set don't seem to work properly. Nevertheless, I am certain that my code is somewhere wrong. I would like to solve the following problem: max 2x-x^2+y subject to 2x^2 + 3y^2 <= 6 2>= x,y >= 0 I would split the [0,2] interval into 8 equal parts by defining k=9 points (0 included) -lambdas in the following code- and observe the value of the objective function and the constraint on these points and approximate it by the following program: (Sorry for the Latex type equations) max Sum_{j=...
2011 Dec 02
0
what is used as height in hclust for ward linkage?
Dear R community, I am trying to understand how the ward linkage works from a quantitative point of view. To test it I have devised a simple 3-members set: G = c(0,2,10) The distances between all couples are: d(0,2) = 2 d(0,10) = 10 d(2,10) = 8 The smallest distance corresponds to merging 0 and 2. The corresponding ESS are: ESS(0,2) = 2*var(c(0,2)) = 4 ESS(0,10) = 2*var(c(0,10)) = 100 ESS(2,10) = 2*var(c(2,10)) = 64 and, indeed, the smallest ESS corre...
2017 Apr 07
2
[PATCH net-next 3/3] virtio-net: clean tx descriptors from rx napi
On Fri, Apr 7, 2017 at 3:28 PM, Michael S. Tsirkin <mst at redhat.com> wrote: > On Mon, Apr 03, 2017 at 01:02:13AM -0400, Willem de Bruijn wrote: >> On Sun, Apr 2, 2017 at 10:47 PM, Michael S. Tsirkin <mst at redhat.com> wrote: >> > On Sun, Apr 02, 2017 at 04:10:12PM -0400, Willem de Br...