search for: lue

Displaying 20 results from an estimated 33 matches for "lue".

Did you mean: due
2010 May 30
4
Data Frame as Hash Table
I'm interested in using a data frame as if it were a hash table. For instance if I had the following, > (d <- data.frame(key=seq(0.5, 3, 0.5), value=rnorm(6))) key value 1 0.5 -1.118665122 2 1.0 0.465122921 3 1.5 -0.529239211 4 2.0 -0.147324638 5 2.5 -1.531503795 6 3.0 -0.002720434 Then I'd like to be able to quickly retrieve the "value" of "key" 1.5 to get -0.53. How would one go about doing this? Yours, Al...
2010 Apr 25
3
Determining Index of Last Element in Vector
...So the question is, is there a better way specify the last element of a vector? If not, is there a better way to duplicate all elements of a vector except for the first and last? (I know you can achieve this using two lines, but I'm writing because I want to do it using one.) Alan -- Alan Lue Master of Financial Engineering UCLA Anderson School of Management [[alternative HTML version deleted]]
2005 Dec 06
1
how to get or store the intermediate v?lues while running a function
Dear all, While running a function I伌m getting only the final output of the function. Bit if I like to store or recover some values that are intermediate in the function calculations which command I have to use for storing those values..... hope u understand..... for eg........ a<-function(a,b,c,d) { k=a+b l=c+d m=k+l } in this example the function will return only the value of "m&quo...
2010 May 26
2
Avoiding Loops When Iterating Over Statement That Updates Its Input
Since `for' loops are slow in R, and since `apply' functions are faster, I was wondering whether there were a way to use an apply function?or to otherwise avoid using a loop?when iterating over a statement that updates its input. For example, here's some such code: r.seq <- 2 * (1 / d$Dt[1] - 1) for (i in 2:nrow(d)) { rf <- uniroot(bdt.deviation, interval=c(0, 1),
2011 Apr 16
1
cajolst
...t "bpoint") by using cajolst function. Finally, I've tried Johansen and Juselius data and procedure, that is described by dr. B. Pfaff ("Analysis of Integrated and Co-integrated Time Series with R"): > example(ca.jo) ... [data, formulas and other related stuff] ... > lue.vecm<-summary(cajolst(sjd,season=4)) > slotNames(lue.vecm) [1] "classname" "test.name" "testreg" "teststat" "cval" "bpoint" [7] "signif" "model" "type" "auxstat" &quo...
2006 Aug 17
1
putting the mark for censored time on 1-KM curve or competing risk curve
...t;,header=TRUE,sep="\t") library(cmprsk) library(survival) attach(dat) par(mfrow=c(2,1)) curve<-cuminc(SURVEFP/365.25,STATREP,Ritux) plot(curve,xlab="years",curvlab=c("No rituximab", "Rituximab"),lty=1:2,col=c("red","blue"),mark.time=TRUE) a<-survfit(Surv(SURVEFP/365.25,STATREP)~Ritux,type="kaplan-meier") plot(a,main="OS for whole group",conf.int=F,xlab="years",ylab="probability",lty=1:2,col=c("red","b lue")) ------------------- Could y...
2008 Nov 07
1
Updating Packages with Personal Library
I'm having trouble running `updates.packages()' and installing into a personal library. Setup: 1. .Renviron file contains: R_LIBS_USER="~/lib/R/%p-library/%v" 2. Hence "personal library" is: ~/lib/R/i486-pc-linux-gnu-library/2.6/ 3. Library path upon starting R: > .libPaths() [1] "/home/johnny/lib/R/i486-pc-linux-gnu-library/2.6" [2]
2005 Feb 18
0
[LLVMdev] LLVM built on VS C++ 2005
>> I still may carry on implementing any mods on the VS2003 port over to >> 2005 >> so we know where we are with that. There may well be a second beta so it >> would be good to get any problems in and reported to Microsoft in lue of >> that. > > ok. If both you and Jeff are okay with still implementing a VC2005 version spawning off changes to the VC2003 port then I am happy to do that. >> Q. Is abort() used rather than C++ exception handling for compatibility >> reasons with older C++ compilers ?...
2010 Oct 22
2
Random Forest AUC
...omial) train.predict <- predict(fit,newdata = iris,type="response") library(ROCR) plot(performance(prediction(train.predict,iris$Species),"tpr","fpr"),col = "red") auc1 <- performance(prediction(train.predict,iris$Species),"auc")@y.values[[1]] legend("bottomright",legend=c(paste("Logistic Regression (AUC=",formatC(auc1,digits=4,format="f"),")",sep="")), col=c("red"), lty=1) library(randomForest) fit <- randomForest(Species ~ ., data=iris, ntree=50) train.predict &...
2005 Feb 18
7
[LLVMdev] LLVM built on VS C++ 2005
...gt; > Oh, well we have got a bug to report to Microsoft then ! > > I still may carry on implementing any mods on the VS2003 port over to 2005 > so we know where we are with that. There may well be a second beta so it > would be good to get any problems in and reported to Microsoft in lue of > that. ok. > Q. Is abort() used rather than C++ exception handling for compatibility > reasons with older C++ compilers ? These aren't recoverable errors: These abort calls are really put in for the moral equivalent of "assert(0);": in cases where we expect control no...
2019 Sep 09
4
Error join samba 4.10.7 to samba 4.4.5
...to 4.10.7 and then join 4.10.7 to update DC to 4.10.7 and then works, bu first I need to add a second controller to ensure no downtime. some questions: 1) Why I receive this error? Replicating critical objects from the base DN of the domain Partition[DC=DOMAIN-TEST,DC=com] objects[98/98] linked_values[762/0] Missing parent while attempting to apply records: No parent with GUID cdee5b31-365 d-4c8f-9368-4115b6307a19 found for object remotely known as CN=Domain Users,OU=Gru ps,DC=DOMAIN-TEST,DC=com Failed to commit objects: WERR_DS_DRA_MISSING_PARENT --> not sure if can be related with this...
2005 Feb 18
0
[LLVMdev] LLVM built on VS C++ 2005
...know until someone tries. Oh, well we have got a bug to report to Microsoft then ! I still may carry on implementing any mods on the VS2003 port over to 2005 so we know where we are with that. There may well be a second beta so it would be good to get any problems in and reported to Microsoft in lue of that. Q. Is abort() used rather than C++ exception handling for compatibility reasons with older C++ compilers ? > These changes aren't worth rolling back. Also they stand for any c++ compilers that do not implement a noreturn attribute, if there are any. And any that do will likely op...
2009 Sep 10
2
De-duplication before SXCE EOL ?
Can anyone answer if we will get zfs de-duplication before SXCE EOL? If possible also anser the same on encryption? Thanks -- This message posted from opensolaris.org
2010 Nov 05
2
rendering Markdown automatically
I made this thing. Some of you may find it useful. https://github.com/skurfer/RenderMarkdown I'm using it for documentation at work. It could also be handy if you run Apache on your desktop machine and want to share files (for display purposes only) that way. -- Rob McBroom <http://www.skurfer.com/>
2008 Nov 20
1
Math Expression in 3D Plots
...ire("rgl") fn.delta.yrsed <- function(dist, delta.dist, beta.dist=-0.1376463, beta.dist2=0.0088698) { delta.yrsed <- (beta.dist + 2*beta.dist2*dist)*delta.dist + beta.dist2*delta.dist^2 return(delta.yrsed) } plot.deeffect <- function(scolor="blue") { delta.dist <- dist <- seq(0, 16, .5) delta.yrsed <- outer(dist, delta.dist, fn.delta.yrsed) rgl.open() bbox3d(xat=seq(0, 16, 2), yat=0:5, zat=seq(0, 16, 2), color="black") title3d(main="Effect of Change in dist on yrsed", pos=c(NA, 8, 0), c...
2014 Mar 27
3
editing screen/menu colours?
On Wed, 26 Mar 2014 23:34:00 -0400 Gene Cumm <gene.cumm at gmail.com> wrote: > > Say, this is about.txt I'd like to display: > > > > ###### > > [clear screen character, ctrl+l equivalent] > > This is a sample help message. > > Press <red>F1</red> to see about. > > Press <red>F2</red> to see more help. > > ##### >
2020 Aug 03
2
Orc JIT v2 breaks OpenMP in 11.x branch?
...le, I get the following error message: Invalid record (Producer: 'LLVM11.0.0' Reader: 'LLVM 11.0.0'). If I use a debug version of LLVM, compilation fails with a broken assertion: .../llvm/lib/IR/Instructions.cpp:455: void llvm::CallInst::init(llvm::FunctionType*, llvm::Va lue*, llvm::ArrayRef<llvm::Value*>, llvm::ArrayRef<llvm::OperandBundleDefT<llvm::Value*> >, const llvm::Twine&): Assertion `(i > = FTy->getNumParams() || FTy->getParamType(i) == Args[i]->getType()) && "Calling a function with a bad signature!"' fa...
2005 Feb 18
3
[LLVMdev] LLVM built on VS C++ 2005
...gt;> >> So is GCC smarter than VC++? As it turns out, in VC++ the >> declaration of abort() is decorated with __declspec(noreturn). >> >> Whidbey is not stricter than 2003, it is merely buggier. VC++ has >> always complained about functions failing to return a value; this is >> not new in Whidbey. What is new is that it no longer pays attention >> to __declspec(noreturn). > > > Got by a Microsoft bug, sorry about that folks. I should have looked > at abort()'s declaration. > >> That is why it is difficult to justify sup...
2001 Mar 16
0
Some Users Work - Some don't (fwd)
...64 20 69 73 20 73 65 74 20 74 6F 20 54 ield is set to T [2001/03/16 03:38:06, 10] lib/util.c:dump_data(2926) [030] 72 75 65 2E 20 20 45 6E 74 65 72 20 61 20 76 61 rue. En ter a va [2001/03/16 03:38:06, 10] lib/util.c:dump_data(2926) [040] 6C 75 65 20 69 6E 20 74 68 69 73 20 66 69 65 6C lue in t his fiel [2001/03/16 03:38:06, 10] lib/util.c:dump_data(2926) [050] 64 2E 0D 0A 30 33 2F 31 33 2F 32 30 30 31 20 34 d...03/1 3/2001 4 [2001/03/16 03:38:06, 10] lib/util.c:dump_data(2926) [060] 3A 34 38 3A 32 36 20 50 4D 20 52 52 20 44 42 43 :48:26 P M RR DBC [2001/03/16 03:38:06, 10] l...
2020 Aug 10
2
Orc JIT v2 breaks OpenMP in 11.x branch?
...Gen=...) at > /u/geoff/llvmrepo/llvm-project/clang/lib/CodeGen/CodeGenFunction.h:1361 > #14 0x00007fb71197d41e in > > clang::CodeGen::CodeGenFunction::EmitOMPWorksharingLoop(clang::OMPLoopDirective > const&, clang::Expr*, > llvm::function_ref<std::pair<clang::CodeGen::LValue, > clang::CodeGen::LValue> (clang::CodeGen::CodeGenFunction&, > clang::OMPExecutableDirective const&)> const&, > llvm::function_ref<std::pair<llvm::Value*, llvm::Value*> > (clang::CodeGen::CodeGenFunction&, clang::OMPExecutableDirective > const&, cl...