search for: alfa

Displaying 20 results from an estimated 397 matches for "alfa".

2011 Aug 23
2
How can I do these simulations with R code
1) The Pareto P(alfa) distribution is defined by its density f(x|alfa) =alfa*X^(-alfa-1) over (1 to infinity). Show that it can be generated as the -1/alfa power of a uniforme variate. Plot the histogram and the density. 2) The Poisson distribution P(lambda) is connected to the exponential distribution through the Pois...
2007 Sep 10
1
MLE Function
...nternet, however, it gives the following errors, does anybody know what is happening to cause such errors, or does anybody know any better tutorial material on this particular subject. > x.gam<-rgamma(200,rate=0.5,shape=3.5) > x<-x.gam > library(stats4) > ll<-function(lambda,alfa){n<-200;x<-x.gam -n*alfa*log(lambda)+n*log(gamma(alfa))-9alfa-1)*sum(log(x))+lambda*sum(x)} Error: syntax error, unexpected SYMBOL, expecting '\n' or ';' or '}' in "ll<-function(lambda,alfa){n<-200;x<-x.gam -n*alfa*log(lambda)+n*log(gamma(alfa))-9alfa&quo...
2009 Sep 11
1
call Fortran from R
Dear R users, I have to call fortran program from within R (R 2.8.1 on ubuntu 8.10 machine). Suppose I have a fortran code like this (this is only a toy model, my working model is far more complex, but input/output is similar) DOUBLE PRECISION FUNCTION model(times, alfa, beta) DOUBLE PRECISION alfa, beta, times model=beta*sin(times)+alfa*cos(times) END FUNCTION which is saved as model.f. I wrote a wapper like this (saved as wrapper.f) SUBROUTINE model_wrapper(times, alfa, beta, answer) DOUBLE PRECISION times, alfa, beta, answer...
2008 May 08
3
MLE for noncentral t distribution
...tions. After plotting the histogram, I found that it looks like non-central t distribution. I would like to get MLE for mu and df. I found an example to find MLE for gamma distribution from "fitting distributions with R": library(stats4) ## loading package stats4 ll<-function(lambda,alfa) {n<-200 x<-x.gam -n*alfa*log(lambda)+n*log(gamma(alfa))-(alfa- 1)*sum(log(x))+lambda*sum(x)} ## -log-likelihood function est<-mle(minuslog=ll, start=list(lambda=2,alfa=1)) Is anyone how how to write down -log-likelihood function for noncentral t distribution? Thanks a lot!! Kate [[al...
2005 Sep 06
2
(no subject)
...ues depending on the #starting values too, i use the trial and error method to find appropriate #starting values, but i am sure, there is a clear way how to do it, no? #shouldn't i actually get more or less the same parameterestimates with both #methods? library(stats4) > ll<-function(alfa,beta) + {n<-24 + x<-data2 + -n*log(alfa)-n*log(beta)+alfa*sum(x^beta)-(beta-1)*sum(log(x))} > est<-mle(minuslog=ll, start=list(alfa=10, beta=1)) There were 50 or more warnings (use warnings() to see the first 50) > summary(est) Maximum likelihood estimation Call: mle(minuslogl = ll,...
2017 Jul 30
3
greek letters do not work in expression
Dear all, I appreciate suggestions for following problem. I wrote to RStudio: plot(c(1,20),c(1,20), xlab = expression(paste(alfa))) or the same happen when I wrote: plot(c(1,20),c(1,20), xlab = expression(alfa)) what happen is, that description under x label is exactly "alpha", not greek letter alfa (?). Please where should I search problem, or what information to sent to list for identification of this problem? Th...
2007 Jul 04
1
Long-tail model in R ... anyone?
...tuff related with the Long-Tail model [1]. I did some tests with the data in table 1 (from [1]), and plotted figure 2 (from [1]). (See R code and CSV file at the end of the email) Now, I'm stuck in the nonlinear regression model of F(x). I got a nice error: " Error in nls(~F(r, N50, beta, alfa), data = dataset, start = list(N50 = N50, : singular gradient " And, yes, I've been looking for how to solve this (via this mailing list + some google), and I could not come across to a proper solution. That's why I am asking the experts to help me! :-) So, any help would be much ap...
2017 Jul 30
2
greek letters do not work in expression
...ul 30, 2017, at 8:25 AM, Uwe Ligges <ligges at statistik.tu-dortmund.de> wrote: > > > > On 30.07.2017 17:22, Milan Cisty wrote: >> Dear all, >> I appreciate suggestions for following problem. I wrote to RStudio: >> plot(c(1,20),c(1,20), xlab = expression(paste(alfa))) >> or the same happen when I wrote: >> plot(c(1,20),c(1,20), xlab = expression(alfa)) > > Write "alpha", not "alfa". To Misty; This makes me wonder if the internationalization of the R documentation is overly "aggressive" in changing the spellin...
2006 Apr 28
2
entries that match a regexp
Hi all, I am trying to filter the element of a df that start with "TF", like this: alfa = c(123221,"TF13124",41243,"TF1234",32414,"TF13124","TF14333",2134123,"TF1234") beta = c("type_a","type_b","type_a","type_g","type_d","type_a","type_g","type_a","ty...
2003 Oct 04
3
a bug of function plot (PR#4405)
...from=0.1,to=4),lty=2,col="blue") } text(3,0.35,"-- theoretical",col="red",adj=c(0,0)) text(3,0.3,"-- moment type", adj=c(0,0)) text(3,0.25, "-- Kernel type", col="blue", adj=c(0,0)) } function28<-function(X,x,c,b){ est<-function(X,x,alfa){ fx<-(1/gamma(alfa))*((alfa-1)/x)*(alfa*X/x)^(alfa-1)*exp(-alfa*X/x) fx } n<-length(X) result<-colSums(sapply(x,function(x){est(X,x,alfa=(n^c)*log(n)^b)}))/length(X) result } X1<-rexp(100) x1<-seq(0.1,4,length=100) Run the function like this: drawexp(X1,x1,0,0.5) **************...
2011 Aug 04
1
GitHub - How to resolve this issue of preventing push to origin?
...$ git push origin master Enter passphrase for key ''/c/Users/Medicine - SWEng/.ssh/id_rsa'': ERROR: Repository not found. fatal: The remote end hung up unexpectedly **EDIT:** Output of running `git remote -v`: $ git remote -v heroku git-Vgi1d2+GxVTQT0dZR+AlfA@public.gmane.org:young-rain-273.git (fetch) heroku git-Vgi1d2+GxVTQT0dZR+AlfA@public.gmane.org:young-rain-273.git (push) origin git-9UaJU3cA/F/QT0dZR+AlfA@public.gmane.org:SWEngineer7sample_app.git (fetch) origin git-9UaJU3cA/F/QT0dZR+AlfA@public.gmane.org:SWEngineer7sample_app.git (...
2005 Oct 31
7
Downloading zip files
I have not had a great amount of success installing/updating packages from the "Packages" menu of Rgui under Windows XL. (Except for installing from loacal zip files.) But I am not asking for help in using these facilities because I prefer to keep a folder of package zip files. On the other hand I do find it tedious having to right-click "Save link as" on every individual
2005 Nov 22
1
spnego_gen_negTokenTarg failed: No credentials cache found
...main. I can run wbinfo -g, -t, -u -p without error and get users from AD I can run getent groups passwd and get the users and groups from AD Here are the results from trying to connect to a share with smbclient from localhost: AQMLIN03:/ # smbclient //aqmlin03/gemensam -U roca1 Password: Domain=[ALFA-MOVING] OS=[Unix] Server=[Samba 3.0.20b-3.1-SUSE] tree connect failed: NT_STATUS_ACCESS_DENIED AQMLIN03: # smbclient -k //aqmlin03/gemensam ads_krb5_mk_req: krb5_get_credentials failed for cifs/aqmlin03.alfa-moving@ALFA-MOVING.SE (Ticket expired) spnego_gen_negTokenTarg failed: Ticket expired ses...
2005 Sep 12
1
fit data with gammadistribution
...(data2) scale<-var(data2)/mean(data2) i get the idea what the parameters of the gammadistribution would be. but if i try using the method mle() i get stock and i don't know, how to make it work. can anybody help me? thank you very much, indeed. Nadja I tried so fare ll<-function(lambda,alfa) {n<-24 x<-data2 -n*alfa*log(lambda)+n*log(gamma(alfa))-(alfa-1)*sum(log(x))+lambda*sum(x) est<-mle(minuslogl=ll,start=list(lambda=29827.51,alfa=0.4954725)) summary(est) NaN's are produced with optim, i just don't know how to avoid this!
2016 Sep 09
3
Recommendation about an usb wireless adapter to use it as HostAP
Hi all, I would like to install/test CentOS 7.X as a hostap for my home. I am thinking to use an Alfa (http://www.alfa.com.tw) usb wireless adapter or TP-Link. BUt there is not much information in Alfa's or TP-Link's web sites about which of them can run as a HostAP. If I can find any adapter that supports ac with a throughput of 150 Mbps/300Mbps, it would be great. Any recommendation? Ma...
2004 Mar 30
0
koq.q ---- Kent O' Quigley R2
...ance for what you can do about it Yours Faithfully Dr. Antonello Romani Dipartimento di Medicina Sperimentale Sezione di Patologia Molecolare e Immunologia via Volturno 39 43100 Parma Italy #----------------------------------------------------------------------------------------------- find.mu.alfa <- function(theta, theta1, x, ell, which,...) { # # find theta=c(beta,mu,alfa) which maximize # Expected Log-Likelihood given by ell # # Set lower and upper bounds for mu (-Inf,Inf) # and alfa (0,Inf) # lower <- c(which, T, 0) * theta lower[c(which, T, 0) == T] <- - Inf upper <-...
2017 Oct 20
3
nls() and loop
...ta > Logiscorri<-function(){ + a<-runif(1, min=0, max=150)#devuelve 1 al azar dentro de un max y un min + b<-runif(1, min=0, max=100) + g<-runif (1, min=0, max=1) + d<-runif (1,min=0, max=100) + + ## estimo la curva de distribucion de mis datos + caiman<-nls(SVL~DE+(alfa/(1+exp(-gamma*ANO))), + data=data, + start=list(alfa= a ,gamma= g, DE= d), + control=nls.control(maxiter = 100, warnOnly=TRUE), + trace=FALSE) + caimansum<-summary(caiman)#ME DA LOS PARAMETROS ESTIMADO, EL NUM DE ITERACIONES + ## anali...
2018 Oct 11
1
Ask for little change :)
Is it possible, that dovecot-lmtp, has in inserted "Received:" header something about its version ie. instead: --8<---------------cut here---------------start------------->8--- Received: from alfa.kjonca by alfa.kjonca with LMTP id n1O7D5Q3v1toSQAApvcrCQ (envelope-from <envelope at from>) for <kjonca at localhost>; Thu, 11 Oct 2018 13:44:20 +0200 --8<---------------cut here---------------end--------------->8--- would be: --8<---------------cut here---------------s...
2014 Mar 15
0
Strange difference between mails delivered with dovecot-lda and lmtp
...e fetched again. During duplicate hunting I found something strange: messages fetched yesterday (passed to dovecot with lda have additional line) have additional line at the end: for example --8<---------------cut here---------------start------------->8--- diff cur/1392241092.M478532P15313.alfa,S=13668,W=13925:2,a cur/1394814438.M978438P14745.alfa,S=13567,W=13823:2,a 1,6c1,4 < Return-Path: <system at przelewy24.pl> < Delivered-To: <kjonca at localhost> < Received: from alfa.kjonca < by alfa.kjonca (Dovecot) with LMTP id p94PDcTp+1LROwAApvcrCQ < for &...
2017 Jul 30
0
greek letters do not work in expression
On 30.07.2017 17:22, Milan Cisty wrote: > Dear all, > I appreciate suggestions for following problem. I wrote to RStudio: > plot(c(1,20),c(1,20), xlab = expression(paste(alfa))) > or the same happen when I wrote: > plot(c(1,20),c(1,20), xlab = expression(alfa)) Write "alpha", not "alfa". Best, Uwe Ligges > what happen is, that description under x label is exactly "alpha", not greek > letter alfa (?). > Please where should...