Displaying 20 results from an estimated 26 matches for "gend".
Did you mean:
end
2011 Sep 04
1
output and save multiple dataset from a function: sorry I could not figure out this....
Dear list:
Before going into my problem, R list has been awesome for me ...thank you
for the help. I have a simple problem, however I could get a answer to it...
#my data
myseed <- c(1001:1030)
gend <- function(x){
set.seed(x)
var <- rep(1:4, c(rep(4, 4)))
vary <- rnorm(length(var), 50, 10)
mat <- matrix(sample(c(-1,0,1), c(10*length(var)), replace = TRUE), ncol =
10)
mydat <- data.frame(var, vary, mat)
#filename = paste("file", x, ".txt", sep="")
#...
2011 Dec 09
1
[LLVMdev] Finding the uses of a global variable
Hi everyone,
I am writing a pass that finds all uses of global variables (my goal is to
find the uses of strings, and strings are defined as global variables). So,
I can iterate over global vars by
for(Module::global_iterator gi = M.global_begin(), gend = M.global_end();
gi != gend; ++gi) ......
But if I use its def-use chain
for(Value::use_iterator i = gi->use_begin(), e = F->use_end; i!=e; ++i)
it is not actually able to find its uses, as it gives <null> instructions!
I have even tried to iterate over instructions in the module, then...
2012 Jan 26
2
extracting from data.frames for survival analysis
Hi,
I have a data frame:
> class(B27.vec)
[1] "data.frame"
> head(B27.vec)
AGE Gend B27 AgeOn DD uveitis psoriasis IBD CD UC InI BASDAI BASFI Smok UV
1 57 1 1 19 38 2 1 1 1 1 1 5.40 8.08 NA 1
2 35 1 1 33 2 2 1 1 1 1 1 1.69 2.28 NA 1
3 49 2 1 40 9 1 1 1 1 1 1 8.30 9.40 NA 0
4...
2004 Jun 18
3
[LLVMdev] MachineOperand: GlobalAddress vs. ExternalSymbol
...larations, but that's scary).
There's another issue I don't understand. The module consists of functions and
constants. I'd expect that external function declarations are also constants,
with appropriate type. However, it seems they are not included in
[Module::gbegin(), Module::gend()], insteads, they a Function objects with
isExternal set to true.
To me this seems a bit confusing -- it would be clearer if there we plain
functions with bodies and everything else were GlobalValue.
Anyther question is about SymbolTable. Is it true that it's a mapping from
name to objec...
2004 Jun 19
2
[LLVMdev] MachineOperand: GlobalAddress vs. ExternalSymbol
On Fri, 2004-06-18 at 10:13, Chris Lattner wrote:
> Module::gbegin/gend iterate over the global variables, and ::begin/end
> iterate over the functions, some of which may be prototypes.
This confused Vladimir and I remember it confusing me when I was
reviewing LLVM core a few months ago. Would it be worthwhile to consider
naming these globals_begin/globals_end an...
2004 Jun 19
1
[LLVMdev] MachineOperand: GlobalAddress vs. ExternalSymbol
...t; > There's another issue I don't understand. The module consists of
> > functions and constants. I'd expect that external function declarations
> > are also constants, with appropriate type. However, it seems they are not
> > included in [Module::gbegin(), Module::gend()], insteads, they a Function
> > objects with isExternal set to true.
>
> Module::gbegin/gend iterate over the global variables, and ::begin/end
> iterate over the functions, some of which may be prototypes. Function
> prototypes aren't really any more "constant" t...
2004 Jun 18
0
[LLVMdev] MachineOperand: GlobalAddress vs. ExternalSymbol
...actoring easier.
> There's another issue I don't understand. The module consists of functions and
> constants. I'd expect that external function declarations are also constants,
> with appropriate type. However, it seems they are not included in
> [Module::gbegin(), Module::gend()], insteads, they a Function objects with
> isExternal set to true.
Module::gbegin/gend iterate over the global variables, and ::begin/end
iterate over the functions, some of which may be prototypes. Function
prototypes aren't really any more "constant" than other functions are....
2001 Mar 19
0
DUP=T/F
...ng a difference in the 7th or 8th significant digit depending
on whether I set DUP=T or DUP=F in the .Fortran call below. While this is not a huge
error it is bigger than I would expect and may be a symptom of another problem. Any
comments or suggestions? (R1.2.2 on Solaris.)
Paul Gilbert
_______
genD.ARMA <- function(model, data, d=0.01, eps=1e-4, r=6, warn=F){
n <-length(c(output.data(data))) # this has the same length as the residual
sampleT <-periods(data)
ps <-dim(model$A)[3]
ms <-dim(model$C)[3]
ns <-ps # this could be 1 except z0 is used for TREND a...
2004 Oct 19
1
[LLVMdev] Re:question about Insert callInst to call a function in library
...ecodeStr> X("DecodeStr", "Decode to visible string");
}
bool DecodeStr::runOnFunction(Function &F){
get_randKey(F.getParent());
DecodeString(F.getParent());
return true;
}
void DecodeStr::get_randKey(Module *M){
for(Module::giterator gI=M->gbegin(),gE=M->gend();gI!=gE;++gI){
std::string GVname = gI->getName();
if(strcmp(GVname.c_str(),"Gvkey")==0){
randKey =(gI->getInitializer());
}
}
}
void DecodeStr::DecodeString(Module *M){
std::cerr<<"filename "<<M->getModuleIdentifier()<<endl;...
2007 Aug 20
3
Differentiation
Hi,
Could anyone tell me what is the command used in R to do
1. Differentiation
2. Newton Raphson method (Numerical Analysis in general...)
Are there any packages separately for this?
Thanks for your help!
BR, Shubha
[[alternative HTML version deleted]]
2008 Jan 26
1
Any numeric differentiation routine in R for boundary points?
...on-negative. For example,
f(x,y)=sqrt(x)*exp(y), then x should be non-negative. I need the
gradient and hessian for some vector (0,y), i.e., I need the gradient and
hessian at the boudary of parameter space.
The "numderiv" package does not work, even for f(x)=sqrt(x), if you
do "genD(f,x=0)", warning message comes out.
I need the one sided derivatives.
Thanks if you could provide some help.
--
View this message in context: http://www.nabble.com/Any-numeric-differentiation-routine-in-R-for-boundary-points--tp15110811p15110811.html
Sent from the R help mailing list archiv...
2007 May 22
1
Manipulating the sizes of multiple screens
Hi,
I used split.screen command to creaye 5 screens,
4 screens contain a plot each, the fifth screen is
designated to a legend. I am having difficulties
setting the dimensions of the screens in a way that
would allow me to have the screen dedicated to the
legend smaller. I end up with a very awkward aspect at
the end: 4 small plots with a big space for the
legend. The gend needs to be at the top of the 4
graphs, it's c...
2004 Apr 02
1
[LLVMdev] Verifier & abort()
...'s linkage now...
for (Module::iterator I = M.begin(), E = M.end(); I != E; ++I)
visitGlobalValue(*I);
for (Module::giterator I = M.gbegin(), E = M.gend(); I != E; ++I)
visitGlobalValue(*I);
// If the module is broken, abort at this time.
abortIfBroken();
return false;
}
The function visitGlo...
2004 Jun 19
0
[LLVMdev] MachineOperand: GlobalAddress vs. ExternalSymbol
On Fri, 18 Jun 2004, Reid Spencer wrote:
> On Fri, 2004-06-18 at 10:13, Chris Lattner wrote:
>
> > Module::gbegin/gend iterate over the global variables, and ::begin/end
> > iterate over the functions, some of which may be prototypes.
>
> This confused Vladimir and I remember it confusing me when I was
> reviewing LLVM core a few months ago. Would it be worthwhile to consider
> naming these global...
2004 Jun 19
1
[LLVMdev] MachineOperand: GlobalAddress vs. ExternalSymbol
...that's reasonable. I'll make the patch but later this weekend ..
bigger fish to fry :)
Reid.
On Fri, 2004-06-18 at 22:44, Chris Lattner wrote:
> On Fri, 18 Jun 2004, Reid Spencer wrote:
> > On Fri, 2004-06-18 at 10:13, Chris Lattner wrote:
> >
> > > Module::gbegin/gend iterate over the global variables, and ::begin/end
> > > iterate over the functions, some of which may be prototypes.
> >
> > This confused Vladimir and I remember it confusing me when I was
> > reviewing LLVM core a few months ago. Would it be worthwhile to consider
>...
2001 Jan 23
0
1.2.1 segfault
...bc in Rf_applyClosure (call=0xd9d7fc, op=0x319cf4, arglist=0xb750c0,
rho=0xb75aac, suppliedenv=0xd9d770) at eval.c:501
#14 0x7a1fc in applyMethod (call=0xd9d7fc, op=0x319cf4, args=0xb750c0,
rho=0xb75aac, newrho=0xd9d770) at objects.c:117
#15 0x7a660 in Rf_usemethod (generic=0xefffc9b0 "genD", obj=0xd9f398,
call=0x3c1870, args=0x15d400, rho=0xb75aac, ans=0xefffc9ac)
at objects.c:252
#16 0x7a930 in do_usemethod (call=0x430e4c, op=0x1d0c50, args=0x430e30,
env=0xb75aac) at objects.c:325
#17 0x56aa0 in Rf_eval (e=0x430e4c, rho=0xb75aac) at eval.c:317
#18 0x570bc in Rf_appl...
2002 Aug 19
0
Aktualisierung des Serverprofils fehlgeschlagen!
...!
I have set up Samba as a PDC / Logon-Server for W2K Clients!
Everything went fine and I configured it as the Documentation said.
But suddenly, when I log off from W2K i get the following message:
Die Aktualisierung des Servergespeicherten Profils ist fehlgeschlagen!
Detail: Es steht nicht gen?gend Speicherplatz auf dem Server zur Verf?gung.
Perhaps in english: Saving the serverbased profile failed!
Details: Not enough space on device.
BUT THERE is enough space!!! I can't figure out, where he tries to save the
profile! I thought it would be under \\%N\profiles\%U (like the docu says)....
1998 Feb 26
0
Bus Error
...for me to isolate (it takes a hour on an ultra 10 to get to the point where the
error occurs). I thought I would mention the problem in the hope that someone
can immediately see a bug.
Paul Gilbert
________
hessian.default <- function(func, x, func.args=NULL, d=0.01, eps=1e-4,r=6)
{ D <- genD.default(func,x,func.args=func.args, d=d, eps=eps, r=r)$D
H <- diag(0,length(x))
u <- 0
for(i in 1:length(x))
{for(j in 1:i)
{u <- u + 1
H[i,j] <- D[,u]
NULL
} }
H <- H +t(H)
diag(H) <- diag(H)/2
H
}
-.-.-.-.-.-.-.-.-.-.-.-....
2004 Apr 01
0
[LLVMdev] Verifier & abort()
On Thu, 1 Apr 2004, Reid Spencer wrote:
> On Thu, 2004-04-01 at 18:04, Misha Brukman wrote:
>
> > Perhaps another solution would be to throw an exception with the error
> > message?
>
> Perhaps, but that would violate the programming contract already in
> place. Right now LLVM and its users expect failed verifications to cause
> an abort(). I wouldn't want to
2004 Jun 17
0
[LLVMdev] MachineOperand: GlobalAddress vs. ExternalSymbol
On Thu, 17 Jun 2004, Vladimir Prus wrote:
>
> Hi,
> here I am again with "why is this so" kind of a question. Among different
> types of MachineOperand there are MO_ExternalSymbol and MO_GlobalAddress.
>
> For MO_GlobalAddress, we can get usefull information from the getGlobal()
> method, which returns GlobalValue*. Wouldn'it it be better is
>