Displaying 20 results from an estimated 700 matches similar to: "Perl array conversion in R to compare plots."
2016 Apr 04
0
question about probplot in e1071 package
Luisfo,
Thank you so much! That does what I need.
Best regards,
Tom
On Mon, Apr 4, 2016 at 10:51 AM, Luisfo Chiroque <luisfo89 at yahoo.es> wrote:
> Dear Thomas,
>
> Reading the probplot?s help page, it looks like it is using qqplot
> underneath.
> Thus, I think this is what you need.
> probplot(x, line=FALSE)
> #probplot(y, line=FALSE)
> qq.y <- qqnorm(y,
2016 Apr 04
0
question about probplot in e1071 package
Dear Thomas,
Reading the probplot?s help page, it looks like it is using qqplot underneath.
Thus, I think this is what you need.
probplot(x, line=FALSE)
#probplot(y, line=FALSE)
qq.y <- qqnorm(y, plot=F)
points(qq.y$y, qq.y$x)
I hope this is useful for you.
Best Regards,
Luisfo Chiroque
PhD Student
IMDEA Networks Institute
http://fourier.networks.imdea.org/people/~luis_nunez/
2016 Apr 04
2
question about probplot in e1071 package
Hello!
I am using probplot in the e1071 package and want to do something like the
following, only with the the 2nd plot overlaying the first. I can't seem to
make it work. Any suggestions?
*library(e1071)
**x <- rnorm(100, mean=5)*
*y <- rnorm(100, mean=3)*
*probplot(x, line=FALSE)
*
*probplot(y, line=FALSE)
*
*Regards,*
*Tom*
[[alternative HTML version deleted]]
2013 May 21
0
Outlook 2013 - mounting folders with XLIST
Hello,
>> i do some tests with dovecot 2.1.7 and activated a default special-use
>> config. To get it work with outlook 2013, i also added XLIST to imap
>> capability string. basically this is working.
>>
>> is somebody also using special-use folders successful with outlook 2013?
> yes, testet a few times, works fine, without Junk folder , cause
> outlook
2011 Mar 17
1
assigning to list element within target environment
I would like to assign an value to an element of a list contained in an
environment. The list will contain vectors and matrices. Here's a simple
example:
# create toy environment
testEnv = new.env(parent = emptyenv())
# create list that will be in the environment, then assign() it
x = list(a=1,b=2)
assign("xList",x,testEnv)
# create new element, to be inserted into xList
c = 5:7
2012 Aug 06
1
more efficient way to parallel
Dear All,
Suppose I have a program as below: Outside is a loop for simulation (with
random generated data), inside there are several sapply()'s (10~100) over
the data and something else, but these sapply's have to be sequential. And
each sapply do not involve very intensive calculation (a few seconds only).
So the outside loop takes minutes to finish one iteration.
I guess the better way
2013 Jun 01
1
MS asks for feedback on standards support in Outlook/Exchange
Am 01.06.2013 13:40, schrieb Timo Sirainen:
> On 1.6.2013, at 9.35, Robert Schetterer <rs at sys4.de> wrote:
>
>> Am 01.06.2013 00:28, schrieb Timo Sirainen:
>>> Someone should at least mention that they should support the real SPECIAL-USE instead of just Gmail-specific XLIST..
>>
>> i cant see any major Problems recent with i.e outlook 2013 and dovecot
2011 Mar 26
1
2 questions about probplot in package e1071
The contributed package e1071 does exactly what I want except that I
need to have (1) the abscissa and ordinate axes swapped, with the
probability scale on the bottom and the quantiles scale on the LHS.
Using the following example:
library(e1071)
x <- rnorm(100, mean=5)
probplot(x, line=FALSE)
and (2) I need to have lines connecting the plotted symbols, as you get
with:
2006 May 19
0
e1071 probplot -grouping
Hello,
I am currently using probplot function in the e1071 package to do
cumulative probability plots . I want to be able to do multiple
cumulative probability plots ( based on a grouping of data) on a single
plot. Any help with this would be greatly appreciated.
Thanks.
2013 Oct 30
1
Configuring SPECIAL-USE Dovecot 2.0.9
Hi All,
I'm trying to configure Dovecot 2.0.9 to support Outlook 2013.
As I understand it, I need to configure XLIST. I have added
imap_capability = +XLIST
to 20-imap.conf
When I try to query the IMAP folders I get an error "An IMAP command
Failed". Looking at the logs I get XLIST Command not found.
I can only assume that I'm missing something in the
2013 May 08
1
Xlist in userdb, Foldernames with whitespace?
Hello,
i use dovecot 2.1.7 and exported all my XLIST FolderSettings to userdb
Whole Story is here:
http://dovecot.org/list/dovecot/2013-March/089209.html
This is all successful, but there is one problem left.
I use lines like this to realize individual XLIST Foldernames in usedb:
namespace/inbox/mailbox=Sent namespace/inbox/mailbox/Sent/name=Sent
namespace/inbox/mailbox/Sent/auto=subscribe
2007 Jul 04
2
probabilty plot
Hi all,
I am a freshman of R,but I am interested in it! Those days,I am
learning pages on NIST,with url
http://www.itl.nist.gov/div898/handbook/eda/section3/probplot.htm,
I am meeting a problem about probability plot and I don't know how to
plot a data set with R.
Could somebody tell me the answer,and a example is the best! I will
look forward to your answer.
Thank you very much.
2005 Feb 12
3
data.frame into list by columns; merge and row.names
Hi
a)
I want to make a list out of a data.frame, where each element of the
list is a column of the data.frame.
I looked in the archives and saw a lot of postings but surprsingly
none elucidated me. I also tried the split, aggregate help files and
counldn't see any easy way to do this. I wouldn't be surprised if
it's there, but I really didn't see it.
I solved the problem
2008 Aug 27
1
conversion of data structure between R and Perl
Dear R users,
I am trying to call a Perl subroutine from R . The subroutine returns an
arrray contaning three elements wihch are all strings. But the calling in R
return an integer which is 0. I have no idea how this could happen. Maybe
becasue I shouldn't use system() in R or I should load a particular package
for my R in windows. Please help ....
2016 Apr 04
0
Using R for cURL commands,Message-ID:
On 04/02/2016 05:00 AM, r-help-request at r-project.org wrote:
> Hello,
>
>
> I'm looking for a way in which R can make my live easier.
>
> Currently i'm using R convert data from a dataframe to json's and then sending these json's to a rest api using a curl command in the terminal (i'm on a mac).
>
>
> I've been looking for a way to use R for
2004 Oct 01
1
cumsum over a list or an array
Hello list,
my question is related to svd of a matrix:
b=matrix(rnorm(50),10,5)
mysvd=svd(b)
I would like to compute each xi where xi = di* ui %*% t(vi). I do it by :
xlist=sapply(1:ncol(b), function(x1,y)
y$d[x1]*y$u[,x1]%*%t(y$v[,x1]),y=mysvd,simplify=F) # result is a list
xarray=array(sapply(1:ncol(b), function(x1,y)
y$d[x1]*y$u[,x1]%*%t(y$v[,x1]),y=mysvd),c(nrow(b),ncol(b),ncol(b))) #
2001 Jul 20
0
bug in predict.nnet?
Hi all
I may have found a little problem in the code of predict.nnet, that comes
up only if you have NA's in your dataset:
the present code:
z <- matrix(NA, length(keep), nout, dimnames = list(rn,
^^^^^^^^^^^^
dimnames(object$fitted)[[2]]))
should be (at least if I understand things correctly)
z <- matrix(NA, length(rn),
2008 Sep 17
0
documentation improvement request: add search (PR#12905)
# R for Windows will not send your bug report automatically.
# Please copy the bug report (after finishing it) to
# your favorite email program and send it to
#
# r-bugs at r-project.org
#
######################################################
> help.search("normal probability plot")
No help files found with alias or concept or title matching 'normal
probability plot'
2018 Apr 04
2
Saving Drafts with Roundcube marks old Mails in INBOX as unread.
Hello List,
I have a problem with the client Roundcube. Whenever I save a draft to the Folder INBOX.Drafts a old mail in my INBOX will be marked as unread.
Here are the IMAP Logs from Roundcube and Dovecot debug logs. I have no idea why it happens. The IMAP protocol looks normal to me but as you can see in the second to last line in the Dovecot log Dovecot is changing the flag of an old E-Mail
2010 Apr 01
1
IMAP extensions & their meanings
I know that is is not really a Dovecot problem; however, I was
wondering where I could get a complete list of the terms used in the
'capability' line. I have not had any success in finding out what
things like "XLIST" refer to. I don't believe that is one that Dovecot
uses; however, I have seen it with other IMAP servers, plus lots of
other flags that I do not understand.
I