search for: minx

Displaying 20 results from an estimated 37 matches for "minx".

Did you mean: min
2012 Mar 10
1
How to improve the robustness of "loess"? - example included.
...robustness of the fit. Below I paste an example to illustrate the problem: tmp=rnorm(2000) X.background = 5+tmp; Y.background = 5+ (10*tmp+rnorm(2000)) X.specific = 3.5+3*runif(1000); Y.specific = 5+120*runif(1000) X = c(X.background, X.specific);Y = c(Y.background, Y.specific) MINx=range(X)[1];MAXx=range(X)[2] my.loess = loess(Y ~ X, data.frame( X = X, Y = Y), family="symmetric", degree=2, span=0.1) lo.pred = predict(my.loess, data.frame(X = seq(MINx, MAXx, length=100)), se=TRUE) plot( seq(MINx, MAXx, length=100), lo.pred$fit, lwd=2,col=2, "l"...
2005 Nov 01
5
Unexpected result from binary greater than operator
Hi All, I recently encountered results that I did not expect, exhibited by the following code snippet: test <- function() { minX <- 4.2 min0 <- 4.1 sigmaG <- 0.1 Diff <- minX-min0 print(c(Diff=Diff,sigmaG=sigmaG)) cat("is Diff > sigmaG?:", Diff > sigmaG,"\n") cat("is (4.2 - 4.1) > 0.1?:",(4.2 - 4.1) > 0.1,"\n") cat("is 0.1 > 0...
2014 Feb 04
2
[PATCH 1/3] nv50: rework primid logic
Functionally identical but much simpler. Should also better integrate with future layer/viewport changes/fixes. Cc: 10.1 <mesa-stable at lists.freedesktop.org> Signed-off-by: Ilia Mirkin <imirkin at alum.mit.edu> --- Not *strictly* necessary in stable, but it will make backporting later fixes easier. No regressions in piglit. src/gallium/drivers/nouveau/nv50/nv50_program.c | 5
2012 Nov 13
0
Restricted Domain Optimization Problem
...problem in R. I'd like to write a program that for a vector of non-negative input values, x, returns a non-negative "normalized" vector y such that sum(y)==1, and y <= maxx (vector of maximum values), and for which sum((x-y)^2) is minimized. Additionally, I'd like to remove (0,minx) from the domain of each y such that any y value may be zero or it may be minx <= y <= maxx, but it may not be 0 < y < minx. Thus small, non-zero values are removed. The last criteria is that the solution must be very fast to compute (e.g. 1/3 second for vector of 5000). I coded somet...
2007 Jun 12
0
distribution graph
...Code: - - - # auxiliary functions: stripmiss and grouping.v : # function for deleting missing values from a vector: stripmiss <- function(xx) xx[is.na(xx)==0] # grouping of a vector into a specified number of # intervals of equal size: grouping.v <- function(xx,ngroups=10,eps=.001) { minx<- min(xx) maxx <-max(xx) if (minx == maxx | ngroups == 1) x2 <- xx if(ngroups==1) x2 <- mean(x2) if (minx < maxx & ngroups > 1) { x1 <- round(.5+eps + (xx - minx)*(ngroups - 2*eps)/(maxx - minx)) x2 <- minx + (x1 - 1) * (maxx - minx)/(ngroups -1) } # end if x2 } # end fu...
2012 Dec 03
1
Resampling Help Needed
.... Even pointing me in the correct direction would be a big help. Thanks! Nathan #read data files (.csv's with 200 rows of x,y,z coordinates) a<-read.csv("A_PW_ASY_M_LII_2011.csv") #calls the plug-in bandwidth estimator Ha <- Hpi(a) #sets min/max grid size for each dimension minX<-min(a$X)-25 minY<-min(a$Y)-25 minZ<-0 maxX<-max(a$X)+25 maxY<-max(a$Y)+25 maxZ<-max(a$Z)+5 #creates kernel utilization distribution fhata <- kde(x=a, H=Ha, binned=FALSE, xmin=c(minX,minY,minZ), xmax=c(maxX,maxY,maxZ)) #calculates territory volume at 95% isopleth Vol95<-...
2006 Mar 27
2
A plotting question - how to get error bars?
...? Any comments gratefully received! Thanks, Toby xvals=1:3 #couldn't get it to be "Jan, Feb, Mar" on the x-axis rgrT1=c(10,20,30) errbarsT1lo=c(0.5830952,0.3741657,0.8944272) errbarsT1up=errbarsT1lo rgrT2=c(25,30,35) errbarsT2lo=c(1.356466,3.535534,1.140175) errbarsT2up=errbarsT2lo minx=min(xvals);maxx=max(xvals) miny=min(rgrT1-errbarsT1lo,rgrT2-errbarsT2lo);maxy=max(rgrT1+errbarsT1up,rgrT2+errbarsT2up) plot(x=0,y=0,type="n",xlim=c(minx,maxx),ylim=c(miny,maxy),lab=c(2,20,0),bty="l",xlab="month",ylab="Relative Growth Rate") points(x=xvals,y=r...
2006 Jan 26
1
Using special characters
...know if it is because I'm using a linux platform... The script is the following: library(grDevices) jpeg(file="Fronteira/FronteiraNova.jpeg", bg="white", quality=100,width = 600, height = 480) grafico.fe<-function(varFA,retFA,varC,retC,covRF,retRF,varD,retD) { minx<-min(100*sqrt(varFA),100*varC,100*sqrt(covRF[1,1]),100*sqrt(covRF[2,2]),100*sqrt(covRF[3,3]),100*sqrt(covRF[4,4]),100*varD) maxx<-max(100*sqrt(varFA),100*varC,100*sqrt(covRF[1,1]),100*sqrt(covRF[2,2]),100*sqrt(covRF[3,3]),100*sqrt(covRF[4,4]),100*varD) miny<-min(100*retFA,retC,retRF,...
2010 Aug 19
1
Correlograms and linear regression
Dear all, I generated a Correlograms and used the panel.ellipse (confidence ellipse and smoothed line) option. Is there a way to get instead of the smoothed line the linear regression? Thanks, As hz -- View this message in context: http://r.789695.n4.nabble.com/Correlograms-and-linear-regression-tp2331071p2331071.html Sent from the R help mailing list archive at Nabble.com.
2011 Aug 15
0
Indexing Permutation Values
...posteriorR <- 1-posteriorL pL <- posteriorL pR <- posteriorR certState = gamma * certState + (1 - gamma) * pL thList[i] = ifelse(certState > 0.55, 1, ifelse(certState < 0.45, 0, ifelse(pL > 0.5, 1, 0))) } return(thList) } thesum=0 j = 1 minx = 0.01; maxx = 0.5; incx = 0.05; x = seq(minx, maxx, incx) miny = 0.0; maxy = 1; incy = 0.05; y = seq(miny, maxy, incy) for (i in x) { for (e in y) { thresholded = calc.probs(i, e) diff <- abs(dat2$choice - Lag(thresholded)) diff = ifelse(is.na(diff), 0, diff) thesum...
2000 Jan 19
1
Segmentation fault using integrate()
Hi all, Running R 0.90.1 on a RH 6.1 system. Installation of the integrate_2.1-2 package went smoothly. My code contains a loop in which integrate() is called several times in each pass. I get a segmentation fault after what seems to be a random number of calls to integrate(). Debug output shows: Program received signal SIGSEGV, Segmentation fault. promiseArgs (el=0x40276414,
2017 Dec 09
0
Remove
...gt; mapply( your_selection_func, group_vec, min_vec, max_vec) > > ... and this will probably return the values as a list (of dataframes if you build the function correctly, so you may may need to then do: > > do.call(rbind, ...) do.call( rbind, mapply( function(dat, grp, minx, maxx) {dat[ dat$GR==grp & dat$x >= minx & dat$x <= maxx, ]}, grp=LETTERS[1:3], minx=c(15,40,60), maxx=c(30,50,75) , MoreArgs=list(dat=DM), IMPLIFY=FALSE)) GR x y A.1 A 25 125 A.2 A 23 135 B.5 B 45 321 B.6 B 47 512 C.9 C 61 521 C....
2010 Nov 24
2
dovecot is confused about mail_location
IMAP logins via fetchmail are failing on my mailserver root at grelber:/home/esr# tail -f /var/log/mail.err Nov 24 16:56:48 grelber dovecot: IMAP(cathy): mail_location not set and autodetection failed: Mail storage autodetection failed with home=/home/cathy Nov 24 16:56:48 grelber dovecot: IMAP(cathy): Fatal: Namespace initialization failed Nov 24 16:57:39 grelber dovecot: IMAP(cathy):
2017 Dec 09
1
Remove
...group_vec, min_vec, max_vec) > > > > ... and this will probably return the values as a list (of dataframes if > you build the function correctly, so you may may need to then do: > > > > do.call(rbind, ...) > > do.call( rbind, > mapply( function(dat, grp, minx, maxx) {dat[ dat$GR==grp & dat$x >= > minx & dat$x <= maxx, ]}, > grp=LETTERS[1:3], minx=c(15,40,60), maxx=c(30,50,75) , > MoreArgs=list(dat=DM), > IMPLIFY=FALSE)) > GR x y > A.1 A 25 125 > A.2 A 23 135 > B.5 B...
2012 May 25
1
Correlograms: using boxes and different variables on rows and columns
I'm trying to make correlograms using corrgram. See below for a simple example. #### library(corrgram) data(baseball) vars1 <- c("Assists","Atbat","Errors","Hits","Homer","logSal") vars2 <- c("Putouts","RBI","Runs","Walks","Years")
2017 Dec 09
2
Remove
> On Dec 8, 2017, at 4:48 PM, Ashta <sewashm at gmail.com> wrote: > > Hi David, Ista and all, > > I have one related question Within one group I want to keep records > conditionally. > example within > group A I want keep rows that have " x" values ranged between 15 and 30. > group B I want keep rows that have " x" values ranged
2006 Dec 21
2
Add line to plot. The line falls outside the current plot.
Hi, I have plotted the graph of x^2 and I would like to add to it a line that is currently outside of the plot ( the points of the line fall outside of the plot ). When I use the function 'lines' the graphics window does not became larger to show this line. Is there any way I can fix this? Also, how can I eliminate the axis from the plot? Thank you.
2010 May 07
1
help in neural networks package
hi all , has anyone tried to predict a univariate time series by a neural networks packages ? please help me in this problem . I am new in R and I did not found any document that explains this problem. thanks in advance David [[alternative HTML version deleted]]
2012 Jun 12
0
Help needed with Elographics touchscreen
..." InputDevice "Touchscreen0" "CorePointer" EndSection Section "InputDevice" Identifier "Touchscreen0" Driver "elographics" Option "Device" "/dev/ttyS4" Option "MinX" "0" Option "MaxX" "4000" Option "MinY" "0" Option "MaxY" "4000" Option "SendCoreEvents" "true" Option "ButtonNumber" "1&quo...
2006 Mar 27
0
not a problem: a submission (PR#8714)
...(12,13,14) errminusT2=c(1,2,3) treatment=c(rep("T1",times=length(xvalsT1)),rep("T2",times=length(xvalsT2))) xvals=c(xvalsT1,xvalsT2) yvals=c(yvalsT1,yvalsT2) errplus=c(errplusT1,errplusT2) errminus=c(errminusT1,errminusT2) RGR=data.frame(treatment,xvals,yvals,errplus,errminus) minx=min(RGR$xvals);maxx=max(RGR$xvals) miny=min(RGR$yvals-RGR$errminus);maxy=max(RGR$yvals+RGR$errplus) plot(x=0,y=0,type="n",xlim=c(minx,maxx),ylim=c(miny,maxy),lab=c(2,4,0),xlab="month",ylab="Relative Growth Rate",axes=FALSE) axis(1,at=1:3,month.abb[1:3]) #axis(1,...