Displaying 12 results from an estimated 12 matches for "xold".
Did you mean:
old
2010 Nov 09
2
Help with Iterator
Dear Experts,
The following is my "Iterator". When I try to write a new function with
itel, I got error.
This is what I have:
> supDist<-function(x,y) return(max(abs(x-y)))
>
> myIterator <- function(xinit,f,data=NULL,eps=1e-6,itmax=5,verbose=FALSE) {
+ xold<-xinit
+ itel<-0
+ repeat {
+ xnew<-f(xold,data)
+ if (verbose) {
+ cat(
+ "Iteration: ",formatC(itel,width=3, format="d"),
+ "xold: ",formatC(xold,digits=8,width=12,format="f"),
+ "xnew: ",formatC(xnew,digits=8,width=12...
2009 Dec 03
1
S4 and head() problems
...the problem appears to require the whole corpus
of my package; and there also appears to be a difference
between sourcing the lines directly, and having them
installed in a package.
The lines in question (I think) are:
setClass("mdm",
representation = representation(
xold = "matrix",
types = "factor"
)
)
"mdm" <- function(xold, types){
new("mdm", xold=xold, types=types)
}
setGeneric("head",function(x,...){standardGeneric("head")})
setMethod("head",signature=&...
2010 Nov 10
1
S4 package warning
...ltivariate generalization of the emulator package
> License: GPL-2
> LazyLoad: yes
I think that the lines in question in my package are:
> setClass("mdm", # "mdm" == "multivariate design matrix"
> representation = representation(
> xold = "matrix",
> types = "factor"
> )
> )
>
>
> setGeneric("mdm",function(xold,types){standardGeneric("mdm")})
> setMethod("mdm",signature("matrix","factor"),function(xold, types)...
2007 Jul 22
1
Package design, placement of legacy functions
I have a function XOLD() from a nearly verbatim port of legacy
FORTRAN in a package. I have remplemented this function as XNEW()
using much cleaner native R and built-in functions of R. I have
switched the package to the XNEW(), but for historical reasons would
like to retain the XOLD() somewhere in the package d...
2005 Dec 29
2
How to fit all points into plot?
Hi,
I have a problem when I want to add new points (or a
new line) to the graph. Some points (or parts of the
line) are not shown on the graph because they lie
beyond the scale of the axis. Is there a way to
overcome this so all points (or the entire line) are
shown on the graph? Here's an example of my problem:
colors = c("red", "blue")
plot(x=rnorm(100,0,1),
2010 Oct 26
1
S4 methods for rbind()
...air", c("ANY", "ANY"),
function(x,y){.mdm_rbind_error(x,y)})
".mdm_rbind_error" <- function(x,y){
stop("an mdm object may only be rbinded to another mdm object")
}
".mdm.rbind_pair" <- function(x,y){
stopifnot(compatible(x,y))
mdm(rbind(xold(x),xold(y)),c(types(x),types(y))) # this is the "meat" of
the rbind functionality
}
setGeneric("rbind")
setMethod("rbind", signature="mdm", function(x, ...) {
if(nargs()<3)
.mdm_rbind_pair(x,...)
else
.mdm_rbind_pair(x, Recall(...))
})
But
LE223:~/pac...
2008 Dec 05
3
Logical inconsistency
Dear colleagues
Please could someone kindly explain the following inconsistencies I've discovered when performing logical calculations in R:
8.8 - 7.8 > 1
> TRUE
8.3 - 7.3 > 1
> TRUE
Thank you,
Emma Jane
[[alternative HTML version deleted]]
2012 Jul 02
0
Fit circle with R
...yold = ynew;
ynew = A0 + xnew*(A1 + xnew*(A2 + 4.*xnew*xnew));
if (abs(ynew) > abs(yold)){
print('Newton-Pratt goes wrong direction: |ynew| > |yold|')
xnew = 0;
break
}
Dy = A1 + xnew*(A22 + 16*xnew*xnew);
xold = xnew;
xnew = xold - ynew/Dy;
if (abs((xnew-xold)/xnew) < epsilon) {break}
if(iter[[i]] >= IterMax){
print('Newton-Pratt will not converge');
xnew = 0;
}
if(xnew < 0.){
print('Newton-Pratt negative roo...
2000 May 22
2
hypot(x,y) instead of pythag(a,b) ?!
...EX(x)[i].r, COMPLEX(x)[i].i);
./src/main/complex.c:285: REAL(y)[i] = hypot(COMPLEX(x)[i].r, COMPLEX(x)[i].i);
./src/main/complex.c:388: r->r = log(hypot( z->r, z->i ));
./src/main/complex.c:411: if( (mag = hypot(z->r, z->i)) == 0.0)
./src/main/plot.c:1201: if ((f = d/hypot(xx-xold, yy-yold)) < 0.5) {
./src/main/plot.c:2455:double hypot(double x, double y)
./src/main/plot.c:2559: d = hypot(xp-xi, yp-yi);
./src/gnuwin32/math/protos.h:43:extern double hypot ( double x, double y );
---------
My "theses"
o when hypot() is available, it should be used since...
2015 Dec 26
2
Proposal for multi location debug info support in LLVM IR
...e, %if.true], [%xfalse, %if.false]
call token llvm.dbg.value(token undef, %x, !var, !())
as the live range of the debug value would end at the end of the
respective basic block.
- A related concern is what the following:
call token llvm.dbg.value(token undef, %xold, !var, !())
if.true:
%xtrue = ... (a)
call token llvm.dbg.value(token undef, %xtrue, !var, !())
br cont
if.false:
%xfalse = ... (b)
call token llvm.dbg.value(token undef, %xfalse, !var, !())
br cont
cont...
2007 May 28
1
off-topic: affine transformation matrix
This may sound like a very naive question, but...
give two lists of coordinate pairs (x,y - Cartesian space) is there any simple
way to compute the affine transformation matrix in R.
I have a set of data which is offset from where i know it should be. I have
coordinates of the current data, and matching coordinates of where the data
should be. I need to compute the composition of the affine
2003 Oct 14
4
Printing Issues with NT type Clients.
Hi. To begin with, I have a freshly built RedHat Linux 8.0 box running samba 2.2.8a. The kernel version is 2.4.18-14. I downloaded and compiled samba from source. I am using LPRng-3.8.9-6 as my printing system. The attached printer is a Lexmark Z22 printer and it is attached to the parralel port.
Problem:
For the life of me, I can't get NT type clients, NT4, 2K and XP to print to samba.