search for: nrun

Displaying 20 results from an estimated 27 matches for "nrun".

Did you mean: arun
2009 Mar 24
4
Error in FrF2 example on Mac OS
...0.9 update for FrF2 did not work out for Mac OS due to an error in an example that ran without error on all other platforms. I do not find any reason for this. In the past, umlauts or tab characters have sometimes been an issue, but I didn't find any of these. The function definition is FrF2(nruns = NULL, nfactors = NULL, factor.names = if (!is.null(nfactors)) { if (nfactors <= 50) Letters[1:nfactors] else paste("F", 1:nfactors, sep = "")} else NULL, default.levels = c(-1, 1), generators = NULL, resolution = NULL, estimable = NULL, max.nfree2fis = FALSE, randomize = T...
2005 Jul 07
2
r: LOOPING
...set has one response variable , the first column, and 60 explanatory variables. 6. we regress each of the explanatory variables against the response and record the slope of the explanatory variable. (i.e. simple linear regression is performed) 7. nsize = 500 since we import 500 rows at a time 8. nruns = how many groups you want to run the analysis on ============================================== ============================================== ============================================== TRY<-function(nsize=500,filename="C:/A.txt",nvar=61,nruns=1) { #the matrix with the payoff...
2010 May 20
1
Geneland error on unix: Error in MCMC(........ :, unused argument(s) (ploidy = 2, genotypes = geno)
...p in SPP.CODES){ + path.sp<- paste(theWd,sp,"/",sep="") + dir.create(path.sp) + GENO.TABLE<-paste(theWd,sp,"geno",sep="") + XY.TABLE<-paste(theWd,sp,"xy",sep="") + MINPOP=1 + MAXPOP=25 + INITPOP=1 + NITS=500000 + THIN=NITS/1000 + nrun <- 10 + burnin <- 200 + geno<-noquote(read.table(GENO.TABLE)) + coord<-read.table(XY.TABLE) + + ## Loop for multiple runs + + for(irun in 1:nrun) + { + ## define path to MCMC directory + + path.mcmc <- paste(path.sp,irun,"/",sep="") + dir.create(path.mcmc) + MCMC(...
2003 May 05
1
commandArgs()
Apologies for asking about this, but I don't quite understand how this works after looking through the FAQ and the Help archives. Let's say I want to pass "1000" as an argument to R. I did the following: >R CMD BATCH --1000 infile outfile When I do print( commandArgs() ), I see [1] ".../R.bin" "--restore" [3] "--save"
2007 Oct 07
6
issetugid() for other procs
Any way to check if another proc has run or been run by a proc that is setuid or seteuid?
2010 Feb 11
1
Code find exact distribution for runs test?
...could be done (not homework). For example, given the data: dtemp <- c(12, 13, 12, 11, 5, 2, -1, 2, -1, 3, 2, -6, -7, -7, -12, -9, 6, 7, 10, 6, 1, 1, 3, 7, -2, -6, -6, -5, -2, -1) The Monte Carlo permutation approach seems to get me part way. # calculate the number of runs in the data vector nruns <- function(x) { signs <- sign(x) runs <- rle(signs) r <- length(runs$lengths) return(r) } MC.runs <- function(x, nperm) { RUNS <- numeric(nperm) for (i in 1:nperm) { RUNS[i] <- nruns(sample(x)) } cdf <- cumsum(table(RUNS))/nperm return(list(RU...
2004 Jun 29
0
gambling problem
...quot; row.names(COMBSPDF)[18] <- "CaCaCa" list(COMBSPDF=COMBSPDF) } #################################################################################### #RUNDIST - allows one to generate a distribution of a gamblers total payoff after playing the game 150 times. RUNDIST<-function(nruns) { stime<-Sys.time() z<-matrix(data=0,nrow=nruns,ncol=1) for (p in 1:nruns) { zrung<-GAMBLING(nsim=150) z[p]<-cumsum(zrung$payoffvec)[150] } par(mfrow=c(1,2)) #plot(z,type="l",main="Accumulated Payoffs",xlab="",font.main=6) hist(z,prob=TRUE,main="H...
2008 Aug 19
7
[LLVMdev] Please help with LLVM C++ integration
...:Int32Ty, 10); CallInst *Add1CallRes = CallInst::Create(my_function, Ten, "some_test_func", BB); Add1CallRes->setTailCall(true); ReturnInst::Create(Add1CallRes, BB); std::cout << "We just constructed this LLVM module:\n\n" << *M; std::cout << "\n\nRunning foo: " << std::flush; std::vector<GenericValue> noargs; GenericValue gv = EE->runFunction(FooF, noargs); std::cout << "Result: " << gv.IntVal.toStringUnsigned(10) << "\n"; return 0; } 2008/8/19, Gordon Henriksen <gordonhenrik...
2004 Mar 15
11
creating a ps. file
Dear all I wrote a routine. At the end of each cycle of the loop I would like to save the result (plot) in a postcriptfile. Of course if I just use dev.print in the following way: dev.print(device=postcript, 'c:/Rfigures/plot_1.ps") I overwrite my results with the second cycle of the loop. I suppose there is a way to define the file name so that several plots are
2011 Jul 07
1
Select element out of several ncdf variables
Hi there I'm working with ncdf data. I have different dataset for 4 runs, 4 seasons and 3 timeslices (48 datasets in total). The datasets have the following dimensions: 96 longitudes, 48 latitudes and 30 time steps. To read all of them in, I wrote the following loop: runs <- c("03","04","05","06") years <- c(1851,1961,2061) seasons <-
2012 Nov 06
1
Confidence intervals for Sen slope in zyp-package
...x -2.0000000 2.000000 # zyp.yuepilon # confidence interval corresponds to nominal 0.95 interval in confint.zyp (output 0.025 0.975) > xy_senslope <- zyp.yuepilon (y, conf.intervals=TRUE) > xy_senslope lbound trend trendp ubound tau sig nruns autocor valid_frac -2.50000000 0.66666667 4.00000000 2.33333333 0.80000001 0.08641075 1.00000000 -0.22400000 1.00000000 linear intercept 0.74285714 3.83333333 ________________________________ Katy Unger-Shayesteh GFZ German Research Centre For Geosciences Section 5.4 Hyd...
2008 Aug 19
0
[LLVMdev] Please help with LLVM C++ integration
...unction, Ten, > "some_test_func", BB); > Add1CallRes->setTailCall(true); > > ReturnInst::Create(Add1CallRes, BB); > > std::cout << "We just constructed this LLVM module:\n\n" << *M; > std::cout << "\n\nRunning foo: " << std::flush; > > std::vector<GenericValue> noargs; > GenericValue gv = EE->runFunction(FooF, noargs); > > std::cout << "Result: " << gv.IntVal.toStringUnsigned(10) << > "\n"; >...
2008 Aug 19
0
[LLVMdev] Please help with LLVM C++ integration
...unction, Ten, > "some_test_func", BB); > Add1CallRes->setTailCall(true); > > ReturnInst::Create(Add1CallRes, BB); > > std::cout << "We just constructed this LLVM module:\n\n" << *M; > std::cout << "\n\nRunning foo: " << std::flush; > > std::vector<GenericValue> noargs; > GenericValue gv = EE->runFunction(FooF, noargs); > > std::cout << "Result: " << gv.IntVal.toStringUnsigned(10) << "\n"; > ret...
2015 Oct 27
3
Add a mapping to a C++ lambda
...gt;(), "lambdaRetVar"); builder.CreateRet(lambdaRes); ExecutionEngine *EE = EngineBuilder(std::move(Owner)).create(); EE->addGlobalMapping(lambdaFN, &lambdaBody); outs() << "We just constructed this LLVM module:\n\n" << *M; outs() << "\n\nRunning main: "; std::vector<GenericValue> noargs; GenericValue gv = EE->runFunction(mainF, noargs); outs() << "Result: " << gv.IntVal << "\n"; llvm_shutdown(); delete EE; return 0;} The output is: We just constructed this LLVM module:...
2008 Jul 04
0
A question about SWITCH field in the output of cpuinfo
Here is the example: ID ADDR FLG NRUN BSPL PRI RNRN KRNRN SWITCH THREAD PROC 0 fffffffffbc259b0 1b 1 0 -1 no no t-0 ffffff0003e05c80 (idle) | | RUNNING <--+ +--> PRI THREAD PROC READY EXISTS E...
2003 Sep 08
2
R video
Hi Does anybody know of any R packages under Windows to produce video files from a sequence of R graphs -- e.g. in .wmv or avi format? Thanks David
2006 Jul 14
0
EOF: object needs to be "field"?
...mat to binary, which is not a big deal. Then I read in the binary data, and it has 3 dimensions: x, y, and time. The following is my code ------------------------------------------------------------------------------------------------------------------------- nx <- 349 ny <- 277 nt <- 312 nRunning <- 12 missing <- -900. datain <- readBin("PWAT-mon.197901-200412.dat",what=numeric(),n=nx*ny*nt,size=4,endian="little") datain[datain<missing] <- NA data <- array(datain,c(nx,ny,nt)) library(clim.pact) eof.c <- EOF(data,mon=1) ---------------------------...
2007 Nov 08
3
[LLVMdev] Newbie JITter
...duleProvider(M); ExecutionEngine* EE = ExecutionEngine::create(MP, false); Function *MainFunction = M->getFunction("main"); if (!MainFunction) { std::cerr << "'main' function not found in module.\n"; return -1; } std::cout << "\n\nRunning main: " << std::flush; // Call the function with no arguments: std::vector<GenericValue> noargs; GenericValue gv = EE->runFunction(MainFunction, noargs); // Import result of execution: std::cout << "Result: " << gv.IntVal.toStringUnsigne...
2011 Nov 25
2
[LLVMdev] LLVM 2.9 - JIT problem on Windows
...t;entryBlock", fooFunc); llvm::ReturnInst::Create(context, basicBlock); llvm::ExecutionEngine *executionEngine = llvm::EngineBuilder(module).create(); llvm::outs() << "We just constructed this LLVM module:\n\n" << *module; llvm::outs() << "\n\nRunning foo...\n"; llvm::outs().flush(); std::vector<llvm::GenericValue> noargs; executionEngine->runFunction(fooFunc, noargs); executionEngine->freeMachineCodeForFunction(fooFunc); delete executionEngine; llvm::llvm_shutdown(); and I am still getting the sa...
2011 Nov 25
0
[LLVMdev] LLVM 2.9 - JIT problem on Windows
> > > Now, I may be wrong, but I was under the impression that a call to > > > InitializeNativeTarget was recommended, if not compulsory, so. why > > > commenting it out not only makes my LLVM code still work, but also > > > prevent my application from generating the above error.?! > > > > My bet is that your code is writing through a stray pointer.