search for: qexp

Displaying 20 results from an estimated 41 matches for "qexp".

Did you mean: qep
2009 Apr 10
1
using more plotting area for a lattice plot
...use more of the plotting space. I've tweaked the parameters I know of. I could also put the plot titles inside the plot if there is a way to do that. Thanks for your input. Regards, Juliet p1 <- runif(1000) # sample data qp1 <- qqmath(~ -log(p1), data = as.data.frame(p1), distribution = qexp,main="A",xlab="",ylab="") qp2 <- qqmath(~ -log(p1), data = as.data.frame(p1), distribution = qexp,main="B",xlab="",ylab="") qp3 <- qqmath(~ -log(p1), data = as.data.frame(p1), distribution = qexp,main="C",xlab="",...
2002 Jun 25
2
FLOAT_LOOKUP version of lsp_to_curve
...float p=.7071067812f; float q=.7071067812f; float w=vorbis_coslook(wdel*k); float *ftmp=lsp; int c=m>>1; by: float w=vorbis_coslook(wdel*k); float p=lsp[0]-w; float q=lsp[1]-w; float *ftmp=lsp + 2; int c=(m>>1) - 1; and: vorbis_invsq2explook(qexp+m) by: vorbis_invsq2explook(qexp+m-1) André --- >8 ---- List archives: http://www.xiph.org/archives/ Ogg project homepage: http://www.xiph.org/ogg/ To unsubscribe from this list, send a message to 'vorbis-dev-request@xiph.org' containing only the word 'unsubscribe' in th...
2011 Aug 22
1
d, p, q, r - What are the math relations with each other of this functions?
Hi all, Using the exponential distribution to exemplify: The dexp function is the PDF (1) and pexp is the CDF (2), that is obtained integrating the PDF. How can I get the qexp and the rexp? Considering that I have the PDF, how this two are mathematically related to the PDF? (1) ke^{-kx} (2) 1-e^{kx} Thanks in advance.
2017 May 27
2
Latin Hypercube Sampling when parameters are defined according to specific probability distributions
...; ]48 ? 50]) >or sample N values from exponential distributions with different rates ? >Here is the code used to perform a LHS when the parameter ?dispersal distance? is defined by one default value in the model: >library(pse) >factors <- c("distance") >q <- c("qexp") >q.arg <- list( list(rate=1/30) ) >uncoupledLHS <- LHS(model=NULL, factors, 50, q, q.arg) >head(uncoupledLHS) >Thanks a lot for your time. >Have a nice day >Nell Nell, I would like to suggest a slightly different method for generating the sample using the lhs libra...
2009 Feb 08
2
how to make this qq plot in lattice and/or ggplot2
Hi Group, Here is some data. p <- runif(1000) # sample data groups <- rep(c(1,2),each=500) #conditioning variable mydata <- cbind(p,groups) n <- length(p) u <- (1:n)/(n + 1) # uniform distribution reference for qqplot logp <- -log(p,base=10) logu <- -log(u,base=10) qqplot(logp,logu) How can I make the above qqplot in lattice and/or ggplot2. The sample is uniform, and I take
2017 Jun 01
1
Latin Hypercube Sampling when parameters are defined according to specific probability distributions
...articular, how can I use your code to apply my model to each of the 50 rows of the data frame ?tabLHS?? Given that one row corresponds to one model simulation, I should have a value generated by the LHS for all distance classes at the first line of the data frame. library(pse) q <- list("qexp", "qunif", "qunif") q.arg <- list(list(rate=exponential_rate), list(min=0, max=1), list(min=0, max=1)) uncoupledLHS <- LHS(model=model_function, input_parameters, N, q, q.arg) hist(uncoupledLHS$data$dispersal_distance, breaks=10) tabLHS <- get.data(uncoupledLHS)...
2008 Aug 21
1
pnmath compilation failure; dylib issue?
...ax2.o imin2.o lbeta.o lgamma.o lgammacor.o mlutils.o pbeta.o pbinom.o pcauchy.o pchisq.o pexp.o pf.o pgamma.o pgeom.o phyper.o plnorm.o plogis.o pnbeta.o pnbinom.o pnchisq.o pnf.o pnmath.o pnorm.o pnt.o polygamma.o ppois.o pt.o ptukey.o punif.o pweibull.o qbeta.o qbinom.o qcauchy.o qchisq.o qexp.o qf.o qgamma.o qgeom.o qhyper.o qlnorm.o qlogis.o qnbeta.o qnbinom.o qnchisq.o qnf.o qnorm.o qnt.o qpois.o qt.o qtukey.o qunif.o qweibull.o sign.o stirlerr.o toms708.o -lgomp -F/Library/Frameworks/R.framework/.. - framework R -Wl,-framework -Wl,CoreFoundation ld: warning, duplicate dylib /...
2017 Jun 01
0
Latin Hypercube Sampling when parameters are defined according to specific probability distributions
...se your code to apply my model to each of the 50 rows of the data frame ?tabLHS?? Given that one row corresponds to one model simulation, I should have a value generated by the LHS for all distance classes at the first line of the data frame. > > > > library(pse) > q <- list("qexp", "qunif", "qunif") > q.arg <- list(list(rate=exponential_rate), list(min=0, max=1), > list(min=0, max=1)) > uncoupledLHS <- LHS(model=model_function, input_parameters, N, q, q.arg) > hist(uncoupledLHS$data$dispersal_distance, breaks=10) > > tabLHS &...
2002 Sep 11
1
floor0.c and lsp.c optimisations
...lised to 1/sqrt(2), multiplied by a series of factors and finally squared means that on exit the 1/sqrt(2) becomes a 1/2 factor and me think that there are some multiplications that can be spared in the process by doing float p=lsp[0]-w; float q=lsp[1]-w; int c=(m>>1)-1; ... q=frexp(p+q,&qexp); qexp--; André --- >8 ---- List archives: http://www.xiph.org/archives/ Ogg project homepage: http://www.xiph.org/ogg/ To unsubscribe from this list, send a message to 'vorbis-dev-request@xiph.org' containing only the word 'unsubscribe' in the body. No subject is needed. Unsu...
2013 May 03
0
Empirica Copula
...data distribution to feed on copula as long as we have d, p and q (pdf, cdf and quantile) functions are available. Hence my code for those are: # Make the functions for data distribution dSAR<-function(SAR){dexp(SAR, rate=0.5)} pSAR<-function(SAR){pexp(SAR, rate=0.5)} qSAR<-function(SAR){qexp(c(seq(0,1, .01)),SAR, rate=0.5)} dper<-function(per) {dexp(per,rate=0.5)} pper<-function(per){pexp(per,rate=0.5)} qper<-function(per){qexp(c(seq(0,1,.01)),per, rate=0.5)} gmb<-gumbelCopula(3,dim=2) # create bivariate copula object with dim=2 #tau(gmb) ## construct a bivariate distri...
2009 Mar 17
3
R does not compile any more on FreeBSD 8.0-CURRENT
...unif.o punif.o qunif.o runif.o dnorm.o pnorm.o qnorm.o rnorm.o dlnorm.o plnorm.o qlnorm.o rlnorm.o df.o pf.o qf.o rf.o dnf.o dt.o pt.o qt.o rt.o dnt.o dchisq.o pchisq.o qchisq.o rchisq.o rnchisq.o dbinom.o pbinom.o qbinom.o rbinom.o rmultinom.o dcauchy.o pcauchy.o qcauchy.o rcauchy.o dexp.o pexp.o qexp.o rexp.o dgeom.o pgeom.o qgeom.o rgeom.o dhyper.o phyper.o qhyper.o rhyper.o dnbinom.o pnbinom.o qnbinom.o rnbinom.o dpois.o ppois.o qpois.o rpois.o dweibull.o pweibull.o qweibull.o rweibull.o dlogis.o plogis.o qlogis.o rlogis.o dnchisq.o pnchisq.o qnchisq.o dnbeta.o pnbeta.o qnbeta.o pnf.o pnt...
2003 Aug 28
2
ks.test()
...lines(x, dexpt(x, lambda = lambda, b = b), lty = lty,col="red")} result <- list(lambda = lambda, b = b) class(result) <- "expt" result} dexpt<-function(x,lambda,b) dexp(x-b,rate=lambda) pexpt<-function(x,lambda,b) pexp(x-b,rate=lambda) qexpt<-function(p,lambda,b) qexp(p,rate=lambda)+b rexpt<-function(n,lambda,b) rexp(n,rate=lambda)+b #PARETO paretofit<-function(x,b, plot.it = F, lty = 1){ x <- sort(x) alpha <- length(x)/sum(log(x/b)) if(plot.it) { lines(x, dpareto(x, alpha = alpha, b = b)...
2003 Jul 18
2
Probability plotting with R
Hello, Our professor asked us to do probability plotting using weibull paper, exponential paper, normal, log-normal paper, etc. I know I can create Q-Q plot for normal dist. and see if all te points are on one line. How do I go about other distributions? I tried generating different samples and use the general qq function. However, I could not do it since I don't know the population
2004 Mar 08
0
Graphical Test
...boot) > > data(aircondit) > > > > # Testing if the aircondit data comes from an exponential distribution > > expqq.fun <- function(data, q) sort(data)/mean(data) > exp.gen <- function(data, mle) rexp(length(data), mle) > n <- nrow(aircondit) > qq <- qexp((1:n)/(n+1)) > exp.boot <- boot(aircondit$hours, expqq.fun,R=999, sim="parametric", + ran.gen=exp.gen, mle=1/mean(aircondit$hours), q=qq) > env <- envelope(exp.boot, level=0.95) > plot(qq, exp.boot$t0,xlab="Exponential quantiles", + ylab="Scaled orde...
2008 Sep 15
0
how to calculate PPCC?
...ion(x,mean,sd) { x <- sort(x) pp <- ppoints(x) cor(qlnorm(pp,meanlog=mean,sdlog=sd),x) } PPCCPOIS <- function(x,lambda) { x <- sort(x) pp <- ppoints(x) cor(qpois(pp,lambda=lambda),x) } PPCCEXP <- function(x,rate) { x <- sort(x) pp <- ppoints(x) cor(qexp(pp,rate=rate),x) }/ Thanks in advanced, [[alternative HTML version deleted]]
2013 Nov 04
2
transform one probability distribution into another
Hi guys Given a exponential curve, is there any function on r that can generate exponential distributed random numbers? in General I want an function that can transform one probability distribution into another?? Regards ****************************************************************** Bander ************************************* [[alternative HTML version deleted]]
2012 Apr 23
2
zipfR help
Hi, I have a question on generating random variables based on zipf-mandelbrot distribution. So when I execute the following lines: ZM = lnre ("zm", alpha = 2/3, B=0.1) zmsample = rlnre (ZM, n =100) zmsample It generates 100 random values based on a zipf-mandelbrot distribution as below. But how do I make sure the generated random number is within the range of 1 - 6000 only? Can I
1999 Feb 09
3
Installing on 64-bit Dec or SGI
Hi all, The systems guys here in the stat dept don't seem to be able to compile R on the Dec Alphas or on the SGIs. Can anyone give them a hand? -Greg ------------------------------------------------------------------------------- Gregory R. Warnes | It is high time that the ideal of success warnes at biostat.washington.edu | be replaced by the ideal of service.
1997 Dec 13
1
R-beta: Compile error; R-0.60.1, Solaris 2.6, gcc 2.7.2.1
...uchy.o gcc -g -I../include -c dchisq.c -o dchisq.o gcc -g -I../include -c pchisq.c -o pchisq.o gcc -g -I../include -c qchisq.c -o qchisq.o gcc -g -I../include -c rchisq.c -o rchisq.o gcc -g -I../include -c dexp.c -o dexp.o gcc -g -I../include -c pexp.c -o pexp.o gcc -g -I../include -c qexp.c -o qexp.o gcc -g -I../include -c rexp.c -o rexp.o gcc -g -I../include -c df.c -o df.o gcc -g -I../include -c pf.c -o pf.o gcc -g -I../include -c qf.c -o qf.o gcc -g -I../include -c rf.c -o rf.o gcc -g -I../include -c dgamma.c -o dgamma.o gcc -g -I../include -c pgamma.c -o pgamma.o g...
1997 Jun 25
3
R-alpha: lbeta, ctrl-C and crashes
1. lbeta and beta do not work properly: lbeta returns its first argument and beta gives the lbeta result. In names.c lines 245-6, the codes for these should be 2 and 3 instead of 1 and 2 2. crtl-C does not work (except the first time) on Red Hat elf Linux (which has many many other problems as well) nor on the previous version of Linux for Amiga. It worked on Slackware aout Linux and now works