search for: lower

Displaying 20 results from an estimated 17313 matches for "lower".

Did you mean: power
2010 Dec 30
2
optim and singularity
...the residuals between the blue circles and green squares by adjusting the limits of the secondary y-axis. Thanks, Eric library(zoo) temp.dat<-read.table(textConnection("Well Meas_Date WTD ECgw GW_Project_Area Region Avg.EM.Survey.Value Avg.Soil.Paste.EC SD_EM_Survey 1 4/12/1999 1.75 2.27 LOWER-UPSTREAM US NA NA NA 1 5/11/1999 1.24 5.04 LOWER-UPSTREAM US NA NA NA 1 5/27/1999 1.27 4.45 LOWER-UPSTREAM US NA NA NA 1 6/3/1999 1.27 4.09 LOWER-UPSTREAM US 3.347069 3.126667 0.6347013 1 6/11/1999 1.52 2.84 LOWER-UPSTREAM US NA NA NA 1 6/18/1999 1.19 2.34 LOWER-UPSTREAM US NA NA NA 1 6/24/1999 1.2...
2010 Dec 22
0
adjust secondary y-axis bounds to minimize visual residuals
...n_this"? I'm guessing there is a function to do this? Thanks, Eric library(zoo) #example data and plotting commands follow temp.dat<-read.table(textConnection("Well Meas_Date WTD ECgw GW_Project_Area Region Avg.EM.Survey.Value Avg.Soil.Paste.EC SD_EM_Survey 1 4/12/1999 1.75 2.27 LOWER-UPSTREAM US NA NA NA 1 5/11/1999 1.24 5.04 LOWER-UPSTREAM US NA NA NA 1 5/27/1999 1.27 4.45 LOWER-UPSTREAM US NA NA NA 1 6/3/1999 1.27 4.09 LOWER-UPSTREAM US 3.347069 3.126667 0.6347013 1 6/11/1999 1.52 2.84 LOWER-UPSTREAM US NA NA NA 1 6/18/1999 1.19 2.34 LOWER-UPSTREAM US NA NA NA 1 6/24/1999 1.2...
2010 Jan 10
1
scatterplot matrix with ggplot2
#I would like to use the below data to make a scatter plot matrix with #code similar to that below the data #conceptually this is the right approach I think #thanks in advance melt.gg <- structure(list(stream = c("Bonham Lower", "Bonham Lower", "Bonham Lower", "Bonham Lower", "Bonham Lower", "Bonham Lower", "Bonham Lower", "Bonham Lower", "Bonham Lower", "Bonham Lower", "Bonham Lower", "Bonham Lower", "...
2013 May 30
2
RFC: a "safe" uniroot() function for future R
...-------------------------------------------------------------------- The help file says ?unirootS()? is a ?safe? version of ?uniroot()?, built on ?uniroot()?, also useful as drop-in replacement of ?uniroot()? in some cases. ?Safe? means searching for the correct ?interval = c(lower,upper)? if ?sign(f(x))? does not satisfy the requirements at the interval end points; see the ?Details? section. We've had this function, called safeUroot() in our package copula for a while now, where an earlier not-exported version has been in my package nor1mix even longer. When I was...
2010 Oct 19
2
superpose.polygon, panel.polygon and their colors
.../e2/help/07/04/15595.html I'm reproducing here the code for your convenience est <- c(1:4, 3:6, 7, 9, 11, 13, 12, 15, 18, 21) cond <- rep(c('a','b'), each = 8) grp <- rep(c('I', 'II'), each = 4, 2) x <- rep(c(.5, .7, .9, 1.1), 4) upper <- est + 1 lower <- est - 1 data <- data.frame(est = est, x = x, cond = cond, grp = grp, upper = upper, lower = lower) rm(est, cond, grp, x, upper,lower) panel.bands <- function(x, y, upper, lower, subscripts, col, ..., font, fontface) { upper <- upper[subscripts] lower <...
2007 Jul 04
2
for loop doesn't stop with upper loop value
Hi list, could anyone please educate me on the following: lst<-seq(47, 239, by=12) for(n in lst) { lower=n; upper=lower+10 for(i in lower+2 : upper) { print(paste(n, " i: ", i, " lower: ",lower, " upper :", upper)) } } does not stop when i = upper A while loop fixes this but, I still don't understand why the for loop doesn't stop when I has th...
2004 Aug 05
1
(hpa-tftpd] remapping with regular expression problem
...e problems during this tftp phase can be solved with the remapping feature quite nicely like: *converting filenames into absolute paths *convert backslashes to slashes One problem missing is to alter the case of the requested files. As the drivers in XP are using a wild combination of upper and lower cases I prefer to convert the complete BartPE directory structure to lower case and force hpa-tftpd to remap all filenames in the BartPE directory only (for example /tftpboot/winpe) to lower case. And that's where I'm stuck: To avoid side effects to other tftp downloads from the same ser...
2007 Jun 28
2
minor flaw in integrate()
Hi, I noticed a minor flaw in integrate() from package stats: Taking up arguments lower and upper from integrate(), if (lower == Inf) && (upper == Inf) or if (lower == -Inf) && (upper == -Inf) integrate() calculates the value for (lower==-Inf) && (upper==Inf). Rather, it should return 0. Quick fix: ### old code ### ### [snip] else {...
2009 Apr 22
2
integrate lgamma from 0 to Inf
...ad of Inf the computation works, but this is against the suggestion of integrates help information to use Inf explicitly. Using stirlings approximation doesnt bring the solution too. ## Stirlings approximation lgammaApprox <- function(x) { 0.5*log(2*pi)+(x-(1/2))*log(x)-x } integrate(lgamma, lower = 0, upper = 1.0e120) integrate(lgammaApprox, lower = 0, upper = 1.0e120) > integrate(lgamma, lower = 0, upper = 1.0e120) 1.374051e+242 with absolute error < 3.2e+235 > integrate(lgammaApprox, lower = 0, upper = 1.0e120) 1.374051e+242 with absolute error < 3.2e+235 integrate(lgamma, lo...
2005 Apr 15
2
abbreviate or wrap dimname labels
...imnames too long to be displayed nicely in a mosaicplot: > library(catspec) > library(vcd) > > data(FHtab) > FHtab<-as.data.frame(FHtab) > > xtable <- xtabs(Freq ~ .,FHtab) > lab <- dimnames(xtable) > lab $OccFather [1] "Upper nonmanual" "Lower nonmanual" "Upper manual" "Lower manual" [5] "Farm" $OccSon [1] "Upper nonmanual" "Lower nonmanual" "Upper manual" "Lower manual" [5] "Farm" abbreviate works here, but gives results that aren't very rea...
2005 Oct 11
2
Sometimes having problems finding a minimum using optim(), optimize(), and nlm() (while searching for noncentral F parameters)
...re are easier way to do what I'm trying to accomplish? The analog in SAS of what I'm trying to come up with is FNONCT. #Begin code ################################################################## # Define necessary values. F.value <- 4 tol <- 1e-8 df.1 <- 5 df.2 <- 200 alpha.lower <- .025 maxit<-1000 # The function to be minimized. Here we are looking for the noncentral # value, 'Lambda', that has at its .975 quantile 'F.value'. Low.Lim.NC.F <- function(Lambda, alpha.lower, F.value, df.1, df.2) { abs(pf(q=F.value, df1=df.1, df2=df.2, ncp=Lambda) - (...
2008 Jun 25
3
[LLVMdev] Problems expanding fcmp to a libcall
Evan Cheng wrote: > On Jun 23, 2008, at 5:35 AM, Richard Osborne wrote: > >> I'm trying to write a backend for a target with no hardware floating >> point support. I've added a single i32 register class. I'm wanting all >> floating point operations to be lowered to library function calls. For >> the most part LLVM seems to get this right. For example >> >> define double @div(double %a, double %b) { >> %result = fdiv double %a, %b >> ret double %result >> } >> >> is expanded to a ISD::CALL of __divdf3 which...
2019 Apr 11
2
Upper case vs lower case in printed and parsed MIR
I am confused about the rules for when upper and lower case letters should be used in MIR. As an example our downstream target has upper case letters in its sub-register indices and as a result we cannot import exported MIR without manually 'lower casing' it first which is obviously rather annoying. Looking in https://llvm.org/docs/MIRLangRef...
2004 Dec 14
3
R stat functions do not work as stated on the mannual (PR#7419)
...I have been playing with R, release 2.0.1 for a week now and have detected = that all stat functions related to distribution probabilities have the same= problem: 1.- According to the manual the log.p parameter is always the last one. 2.- When you use the software, the last parameter seems to be lower.tail Example: > pt (1.1, 5) [1] 0.8392746 > pt (1.1, 5, F) [1] 0.8392746 > pt (1.1, 5, F, T) [1] 0.8392746 >=0D On this example, I have used the Student T distribution. The result of this= example has been tested with the stat calculator at http://calculators.sta= t.ucla.edu/. 1.- T...
2005 Apr 01
1
plotCI error when trying to omit upper or lower bars (PR#7764)
Full_Name: Volker Franz Version: 2.0.1 (2004-11-15) OS: Mac OSX / Debian Submission from: (NULL) (84.58.8.232) Hi there, the new version of plotCI (Version: 2.0.3 of gplots) produces errors if the upper or lower error bars should be omitted by passing NULL as an argument. Older versions of plotCI had no problem with this. Here is an example: library(gplots) means <- c(1,2,3,4,5) upperw <- c(1,1,1,1,1) lowerw <- c(1,1,1,1,1) upper <- means+upperw lower <- means-lowerw plotCI(x=means,uiw...
2013 Mar 15
2
nlrob and robust nonlinear regression with upper and/or lower bounds on parameters
I have a question regarding robust nonlinear regression with nlrob. I would like to place lower bounds on the parameters, but when I call nlrob with limits it returns the following error: "Error in psi(resid/Scale, ...) : unused argument(s) (lower = list(Asym = 1, mid = 1, scal = 1))" After consulting the documentation I noticed that upper and lower are not listed as parameter...
2005 Nov 23
1
qbinom returns NaN
Hi, All: For most but not all cases, qbinom is the inverse of pbinom. Consider the following example, which generates an exception: > (pb01 <- pbinom(0:1, 1, .5, log=T, lower.tail=FALSE)) [1] -0.6931472 -Inf Since "lower.tail=FALSE", Pr{X>1} = 0 in this context, and log(0) = -Inf, consistent with the documentation. However, the inverse of this does NOT recover 0:1: > qbinom(pb01,1, .5, log=T, lower.tail=F) [1] 0 NaN Shouldn't t...
2009 Feb 23
1
r: intergrate behaviour
hello R users strange behavior of the integrate function! i assume this occurs because of the way in which the quadriture is set up! (any comments.) f=function(x){exp(-exp(-x)-5*x)/gamma(5)} xx=seq(from=-20, to=20, length.out=1000) plot(xx,f(xx),type="l") integrate(f, lower=-Inf, upper= 1) integrate(f, lower=-Inf, upper= 10) integrate(f, lower=-10, upper= 11) integrate(f, lower=-Inf, upper= 11) integrate(f, lower=-Inf, upper= Inf) the results: > integrate(f, lower=-Inf, upper= 1) 0.9999586 with absolute error < 2.1e-06 > integrate(f, lower=-Inf, upper...
2007 Jun 08
2
pnorm how to decide lower-tail true or false
Hi to all, maybe the last question was not clear enough. I did not found any hints how to decide whether it should use lower.tail or not. As it is an extra R-feature ( written in http://finzi.psych.upenn.edu/R/Rhelp02a/archive/66250.html ) I do not find anything about it in any statistical books of me. Regards Carmen
2018 May 28
2
to R Core T: mle function in 32bits not respecting the constrain
I have an issue using mle in versions of 32 bits. I am writing a package which I want to submit to the CRAN. When doing the check, there is an example that has an error running in the 32 bits version. The problem comes from the mle function, using it with a lower constrain. In 64 bits version it works fine but when I put it in the R 32 bits it fails. (same numbers, all equal!) The call is: *mle(minuslogl = p.est,start = beta,method = "L-BFGS-B",lower=llim*reduction)* lower = -0.01570427 The optimizer (optim function in 32 bits) display: -0.0157...