Displaying 20 results from an estimated 46 matches for "erg".
Did you mean:
arg
2006 Jun 06
1
Problems using quadprog for solving quadratic programming problem
...e. Thank you very much. Fabian
My R-code also containing the sampel of quadprog starts here:
#sample from quadprog package
library(quadprog)
Dmat <- matrix(0,3,3)
diag(Dmat) <- 1
dvec <- c(0,5,0)
Amat <- matrix(c(-4,-3,0,2,1,0,0,-2,1),3,3)
bvec <- c(-8,2,0)
erg<-solve.QP(Dmat,dvec,Amat,bvec=bvec)
print(erg)
erg<-erg$solution
-dvec%*%erg+.5*erg^T%*%Dmat%*%erg
# my "non working" sample
n<-2
k<-2
Dmatj<-diag((n-1),n)
Dmatj[lower.tri(Dmatj)]<--2
Dmat<-matrix(0,nrow=n*k,ncol=n*k)
for(j in 1:k){
Dmat[((j-1)*n+1):(j*n),((j-...
2011 Mar 22
3
Accelerating the calculation of the moving average
...??????? 10:00:00?????????????? 5.03
20.07.1956????????? 11:00:00?????????????? 4.98
20.07.1956????????? 12:00:00?????????????? 4.94
20.07.1956????????? 13:00:00?????????????? 4.93
?
I want to calculate
the moving average of the right column.
I tried:
dat$index<-1:length(dat$Zeit)
qs<- 43800
erg<-c()
for (y in min(dat$index):max(dat$index)){
m<- mean(dat[(dat$index>=y)&(dat$index<=y+qs+1),3])
erg<-c(erg,m)
}
It does works, but it takes ages. Is there a faster way to compute the moving average?
Thank you,
Tonja Krueger
_______________________________________________...
2010 Dec 08
1
I want to get smoothed splines by using the class gam
Hi all,
I try to interpolate a data set in the form:
time Erg
0.000000 48.650000
1.500000 56.080000
3.000000 38.330000
4.500000 49.650000
6.000000 61.390000
7.500000 51.250000
9.000000 50.450000
10.500000 55.110000
12.000000 61.120000
18.000000 61.260000
24.000000 62.670000
36.000000 63.670000
48.000000 74.880000
I want to get smoothed splines by using the c...
2005 Jul 27
7
gamma distribution
Hi R Users
This is a code I wrote and just want to confirm if the first 1000 values are raw
gamma (z) and the next 1000 values are transformed gamma (k) or not. As I get
2000 rows once I import into excel, the p - values beyond 1000 dont look that
good, they are very high.
--
sink("a1.txt");
for (i in 1:1000)
{
x<-rgamma(10, 2.5, scale = 10)
y<-rgamma(10, 2.5, scale = 10)
2003 Jan 29
1
Scoping rule problem -- solved
Thanks to some comments from Brian D. Ripley, I found my error:
I should not have given a data argument to lm() after creating a
formula-object. This obviously confused things...
Thanks again, I've really learnt again a bit more on R-programming...
Cheers, Winfried
---------------------------------------------------------------------
E-Mail: Winfried Theis <theis at
2002 Jun 03
3
How are people managing startup/shutdown of winbindd?
...our file may vary)
by default, so another solution seems in order.
It's not as important to be able to start and stop winbindd now that it's
getting more robust, but I'd still like something.
How are y'all out there in Samba land handling this?
Manuel Gomez
ER Solutions, Inc.
erg@e-r-solutions.com
2012 Feb 09
1
complex subscript/superscript on axis labels
Hi All,
I am having trouble getting a complex subscript to work. I'm sure it's
possible. Here is what I have:
ylab=expression(paste("log ",L[peak]," [erg ",s^{-1},"]")),
I would like to have the subscript read "peak,gamma" where the gamma
would be the greek symbol. I do want the comma to show as well.
Thanks,
EM
2004 Jan 15
1
Exactness of ppois
...8.1 (2003-11-21) on Windows systems (NT, 2000,
XP).
Try the code:
## Kolmogorov distance between two methods to
## determine P(Poisson(lambda)<=x)
Kolm.dist <- function(lam, eps){
x <- seq(0,qpois(1-eps, lambda=lam), by=1)
max(abs(ppois(x, lambda=lam)-cumsum(dpois(x, lambda=lam))))
}
erg<-optimize(Kolm.dist, lower=900, upper=1000, maximum=TRUE, eps=1e-15)
erg
Kolm1.dist <- function(lam, eps){
x <- seq(0,qpois(1-eps, lambda=lam), by=1)
which.max(abs(ppois(x, lambda=lam)-cumsum(dpois(x, lambda=lam))))
}
Kolm1.dist(lam=erg$max, eps=1e-15)
So for lambda=977.8 and x=1001...
2009 Sep 23
1
Maximum Likelihood Est. regarding the degree of freedom of a multivariate skew-t copula
...ion(z) {
pmst(z, xi[2],Omega[2,2],alpha[2],df)-P_nik[i]
}
u2[i]<-uniroot(f,ber2,tol=0.000001)$root
z?hler<-dmst(c(u1[i],u2[i]),xi,Omega,alpha,df)[1]
nenner<-dmst(u1[i], xi[1] ,Omega,alpha[1],df) * dmst(u2[i], xi[2],Omega,alpha[2],df)
z[i]<-z?hler/nenner
}
lnc<-log(z)
erg<-(-1)*sum(lnc)
return(erg)
}
v<-c(10)
optim(v,c_density, method="SANN", control=list(maxit=20))
-------------- next part --------------
An embedded and charset-unspecified text was scrubbed...
Name: NIKKEI.txt
URL: <https://stat.ethz.ch/pipermail/r-help/attachments/200909...
2008 Mar 20
1
Rmpi and C Code, where to get the communicator
Hello,
I try to write parts of my code in C to accelerate the for-loops. But
basic operations I want to do in R (e.g. start cluster). My R code looks
something like this:
library(Rmpi)
mpi.spawn.Rslaves()
mpi.remote.exec(....)
dyn.load("test.so")
erg <- .Call("test", ....)
....
mpi.close.Rslaves()
mpi.quit()
And my C function looks something like this:
#include <mpi.h>
#include <R.h>
#include <Rdefines.h>
#include <Rinternals.h>
SEXP test (SEXP a, ..){
int rank;
comm ??????
MPI_Comm_rank (comm,...
2013 Jul 30
2
Failed to parse template, wrong number of arguments (create_resources)
...owner => root,*
* group => root,*
* mode => 644,*
* notify => Service["app"],*
* content => template("test/$env.cfg.erb"),*
* }*
* }*
*
*
*
*
*.....*
*}*
*
*
../templates/foo.cfg.erg:
* ServerName <%= appcfg[''serverName''] %>*
*
*
And this is the error I get:
*err: Could not retrieve catalog from remote server: Error 400 on SERVER:
Failed to parse template test/foo.cfg.erb:*
* Filepath: /etc/puppet/modules/test/templates/foo.cfg.erb*
* Line: 1*
* Det...
2011 Mar 07
1
postscript cuts off left margin
...ps",paper="special",width=6,height=6,horizontal=FALSE)
# fake data
x <- c(12,13,14)
y <- c(41,42,43)
plot(x,y,type="n",xlab=expression(paste("log ",nu[peak],"
[Hz]",sep="")),ylab=expression(paste("log ",L[peak]," [",ergs,"
",s^-1,"]",sep="")),ylim=c(41,48),yaxt="n",xaxt="n",xlim=c(12,18),cex.lab=1.3)
axis(2,at=c(41,42,43,44,45,46,47,48),labels=expression(41,42,43,44,45,46,47,48),las=1,cex.axis=1.3)
axis(1,at=c(12,13,14,15,16,17),labels=expression(12,13,14,15,16,17...
2009 Mar 17
1
Adding labels to heatmaps from image()
...go" on axis(4). It looks like the program does not know where or how long axis(4) should be.
I have been stuck with this problem for the past couple of days, desperately need help.
Thanks
Deepa Rajamani
-------------- next part --------------
A non-text attachment was scrubbed...
Name: EHF,ERG,ELF2,ELF3.pdf
Type: application/pdf
Size: 54050 bytes
Desc: EHF,ERG,ELF2,ELF3.pdf
URL: <https://stat.ethz.ch/pipermail/r-help/attachments/20090316/6b56729d/attachment-0003.pdf>
2004 Oct 06
1
Foreign code problem
Hello,
I wanted to test the odesolve package and tried to use compiled C-code.
But when I do:
erg <- lsoda(y, times, "mond", parms, rtol, atol, tcrit=NULL, jacfunc=NULL,
verbose=FALSE, dllname="mond", hmin=0, hmax=Inf)
I get the error message:
Error in lsoda(y, times, "mond", parms, rtol, atol, tcrit = NULL,
jacfunc =...
2009 Sep 29
1
connecting points on a graph
...00 113 Pau9 103 129 Pocc1* 104 128 Pau7 105 111
--
Jolene Sutton
PhD candidate
Department of Zoology
University of Otago
340 Great King St.
PO Box 56
Dunedin 9054
New Zealand
Fax: (64) 3-479-7584
Cell: (64) 027-261-6121
E-mail: jolene.sutton at gmail.com
www.erg.otago.ac.nz
-------------- next part --------------
A non-text attachment was scrubbed...
Name: standardized saddleback loci.pdf
Type: application/pdf
Size: 5138 bytes
Desc: not available
URL: <https://stat.ethz.ch/pipermail/r-help/attachments/20090930/73c20aae/attachment-0002.pdf>
2011 Jul 22
1
Mean and Timeseries modelling
...he means, according to the
different types.
For example: For all days in the year 1950 with the typ 1, I would like to
write the mean value for Typ 1 in year 1950. In year 1951 I would like to
write the mean value for typ 1 in 1951 etc. (for all 18 types)
The output should look like as following:
erg
a m d typ value mean_typ_year
1950 1 1 1 -4.1 0,4
1950 1 2 2 2.7 Mean (Typ2 1950)
1950 1 3 1 -1.3 0,4
1950 1 4 5 -1.9 Mean (Typ5 1950)
1950 1 5 2 0.2 ...
1950 1 6 8 0.5 ...
1951 1 1 1...
2000 Apr 01
1
Bug ? mine or ? in R core
...*/
/* "odbcFetchRows"<- */
/* function(channel,max=0,transposing=F,buffsize=1000,debug=0) */
/* { */
/* erg<-.Call("RODBCFetchRows",as.integer(channel),max=as.real(max), */
/* transposing=as.logical(transposing), */
/* buffsize=as.real(buffsize),debug=as.integer(debug)) */
/* return(erg)...
2018 Jun 14
2
RFC: Atomic LL/SC loops in LLVM revisited
...ed in some other way: e.g. repeatable geenrating a conflict miss
or triggering a trap etc. I don't think any Arm cores ship with
direct-mapped caches so I'll admit this is unlikely.
The possibility for issues increases if the Exclusives Reservation
Granule is larger. For the Cortex-M4, the ERG is the entire address
range <http://infocenter.arm.com/help/index.jsp?topic=/com.arm.doc.100166_0001_00_en/ric1417175928887.html>.
In that case, spills will surely clear the reservation.
There also seem to be documented and very strict forward progress
constraints for ARMv8-M. See
https://st...
2002 Aug 20
0
RODBC/Solaris/Oracle - No Data
...n open a connection but whenever I execute queries, I simply recieve a "No Data" message.
Debugging a query such as "select * from sometable", on the R side of things I receive the column names OK but when it calls down to RODBCFetchRows, the following object gets returned into erg, which in turn gets assigned to dbdata in sqlGetResults.
Browse[1]> dbdata
$data
$data[[1]]
NULL
$stat
[1] -1
I have executed the same query via unixODBC's isql using the same DSN and I receive a full result set with several rows.
Any suggestions please?
Thanks very much,
Phil
-.-.-.-....
2006 Jul 21
1
libdbi-ruby now?
Ruby 1.8.4 from the c4 testing repo is doing fine so far.
But now I need libdbi-ruby.
I don't see that in any of my usual repos or in c4 testing and it does
not seem to be rubygem'able.
Any pointers?
Thanks,
Steve