similar to: identify() doesn't return "true" numbers

Displaying 20 results from an estimated 1000 matches similar to: "identify() doesn't return "true" numbers"

2011 Nov 16
2
outlier identify in qqplot
Dear Community, I want to identify outliers in my data. I don't know how to use identify command in the plots obtained. I've gone through help files and use mahalanobis example for my purpose: NormalMultivarianteComparefunc <- function(x) { Sx <- cov(x) D2 <- mahalanobis(x, colMeans(x), Sx) plot(density(D2, bw=.5), main="Squared Mahalanobis distances, n=nrow(x),
2010 Mar 27
5
producing a QQ plot.
Hello everyone I'm a beginner in Stats and R, I'm using R 2.10.1. I need to create a multivariate qq plot, there is 8 variable group with each has 55 number of input. An example of what I did so far, just to get my point out: > data=read.csv(file.choose(),header=T) > data country village group av_expen P2ary_ed no_fisher 1 Cook Islands Aitutaki D
2002 Jan 08
0
chi square and mahalanobis
Hi all. I am seeking for a statistical suggestion. My data set comprises 382 measures each having 169 variables. Each measure is the outcome of a nuclear magnetic resonance experiment, so each of the 169 points has the same unit. As I want to do some multivariate calibration using these data, I checked whether some multivariate outliers existed. I calculated Mahalanobis distances and did a
1999 Aug 31
1
Suggestion for qqplot() improvement
>>>>> On Tue, 31 Aug 1999 14:57, Werner Stahel <stahel@stat.math.ethz.ch> said: WSt> Here is a suggestion. It seems that qqplots, comparing a sample WSt> to a distribution other than the normal, are not explicitly WSt> available in S or R. I found (in S-plus / Trellis it is, see below) WSt> qqplot(y, rt(300, df = 5)) WSt> as an
1998 Sep 03
2
ppoints
When I look at ppoints I see: ppoints<-function (x) { n <- length(x) if (n == 1) n <- x (1:n - 0.5)/n } However Venables & Ripley (2nd ed, p 165) say ppoints() should return (i-1/2)/n for n>=11; (i-3/8)/(n+1/4) for n<=10. The version below should work as described: ppoints<-function (x) { n <- length(x) if (n <= 10) (1:n - 0.375)/(n + 0.25) else (1:n - 0.5)/n
2005 Jan 19
1
ppoints (PR#7538)
Dear r-bugs, Whilst playing with ppoints I discovered that when one uses it directly, occasional NA's in a vector also become data fractions: ppoints(c(1,2,NA,4)) Would it be a good idea to add a warning message as in: ppoints <- function (n, a = ifelse(n <= 10, 3/8, 1/2)) { if(any(is.na(n))) warning("'n' contains NA's") if(length(n) > 1) n <-
2013 Apr 01
1
95% Confidence Interval for a p-p plot
Hi, I want to create upper and lower 95% confidence intervals for a p-p plot of an empirical distribution with a theoretical gamma distribution. This is my code: x<-rgamma(100,shape=2, rate=1) # empirical data fitdistr(x,"gamma") # fit a gamma distribution dist<-pgamma(x,shape=1.9884256 ,rate=0.8765314 ) # fitted distribution, using the loglikelihood estimated parameters
2009 Sep 17
2
QQ plotting of various distributions...
Hello! I am trying with this question again: I would like to test few distributional assumptions for some behavioral response data. There are few theories about true distribution of those data, like: normal, lognormal, gamma, ex-Gaussian (exponential-Gaussian), Wald (inverse Gaussian) etc. The best way would be via qq-plot, to show to students differences. First two are trivial: qqnorm(dat$X)
2005 Dec 13
8
superimpose density line over hist
Hi all, I'm trying to superimpose a rchisq density line over a histogram with something like: hist(alnlength) lines(density(rchisq(length(alnlength), 4)),col="red") But the rchisq line won't appear anywhere, Anyone knows what I am missing here? Thanks in advance, Albert.
2000 Dec 11
1
qqline (PR#764)
I think qqline does not do exactly what it is advertised to do ("`qqline' adds a line to a normal quantile-quantile plot which passes through the first and third quartiles."). Consider the graph: tmp <- qnorm(ppoints(10)) qqnorm(tmp) qqline(tmp) The line (which I expected go through all the points), has a slightly shallower slope than does the points plotted by qqnorm. I think
2006 Mar 02
2
Bug/Wishlist: 'partial' in 'sort' and 'quantile' (PR#8650)
Hi, This is essentially a reposting of http://tolstoy.newcastle.edu.au/R/devel/05/11/3305.html which had no responses, and the behaviour reported there persists in r-devel as of yesterday. (1) sort() with non-null partial > x = rnorm(100000) > keep = as.integer(ppoints(10000) * 100000) > system.time(sort(x)) [1] 0.05 0.00 0.04 0.00 0.00 > system.time(sort(x, partial = keep)) [1]
2007 Jun 19
2
Function -return value
Hi, I am trying to write a function with the following codes and I would like it to return the values for "alpha beta para parab " seperately. Then I would like to use this funstion for "variable" with factor "a" and "b". But the result turns out to be a matrix with element like "Numeric,2" ... I guess they are just the values for
2006 Apr 13
2
Plotting positions in qqnorm?
Do you know of a reference that discusses alternative choices for plotting positions for a normal probability plot? The documentation for qqnorm says it calls ppoints, which returns qnorm((1:m-a)/(m+1-2*a)) with "a" = ifelse(n<=10, 3/8, 1/2)? The help pages for qqnorm and ppoints just refer to Becker, Chambers and Wilks (1988) The New S Language (Wadsworth & Brooks/Cole),
2012 Dec 02
0
superimpose density line over hist
>>>>> "Romain" == Romain Francois <[hidden email]> >>>>> on Tue, 13 Dec 2005 15:40:59 +0100 writes: ........ Romain> A few comments : Romain> - your code should be reproductible, otherwise it is useless. (that Romain> recommandation is on the posting guide) Romain> - that question is a top ten question
2004 Apr 06
2
percentile-percentile plot
Hi, Is there a function that does percentile-percentile plot. I do not mean the qqplot. I need to plot the percentiles rather than points themselves. I am hoping for a plot that tells me that the x percentile of one data set corresponds to the y percentile of the other. for example a point on the plot of (.5, .2) will tell me that the 50th percentile of the first data and the 20th percentile of
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
2007 Jun 09
1
What ECDF function?
Hello! I want to plot a P-P plot. So I've implemented this function: ppplot <- function(x,dist,...) { pdf <- get(paste("p",dist,sep=""),mode="function"); x <- sort(x); plot( pdf(x,...), ecdf(x)(x)); } I have two questions: 1. Is it right to draw as reference line the following: xx <- pdf(x,...); yy <- ecdf(x)(x); l <- lm(
2003 Aug 06
1
probability plot correlation coefficient
As a newbie to R, I'm still rather at a loss for finding information (the commands names can be rather arcane)so I'm just posting my question: I would like to estimate the shape coefficient of diverse distributions (Weibull, gamma and Tukey-Lambda specifically, but other could be of interest) - Does R have a PPCC utility to estimate such parameter?(maximum value of correlation coef)
2006 Oct 25
1
Drawing a reference line for a qqplot with reference to Weibull distribution
Hi, I'm trying to create a qqplot with reference to a Weibull distribution including a reference line. This is my current code: lights.data <- scan("lights.dat") #Generate Weibull quantiles prob.grid <- ppoints(length(lights.data)) prob.quant <- qweibull(prob.grid , 1.5,4) #Draw QQ plot qqplot(prob.quant,lights.data) #add red reference line qqline(lights.data,col = 2)
2005 Mar 28
1
Reading data from "clipboard"
Dear List, As a way to learn R, I am trying out some of the examples shown in the Reference Cards. I use the following to read a column of numbers from Excel: x <- read.delim("clipboard") My questions are: 1. Why is it that the first number is omitted from the selected data range? How do I tell R to pick up the first number as part of the entire selection? 2. The next thing I