search for: argname

Displaying 20 results from an estimated 95 matches for "argname".

2009 Nov 02
1
two small wishes (with code sugegstions) for R-core
...ith append=TRUE # This prevents a csv file being written in chunks. # If argument append=TRUE is used, a header should not be enforced (may be even be forbidden) # Code suggestion no. 2: please use write.csv <- function (...) { Call <- match.call(write.table, expand.dots = TRUE) for (argname in c("col.names", "sep", "dec", "qmethod")) if (!is.null(Call[[argname]])) warning(gettextf("attempt to set '%s' ignored", argname), domain = NA) rn <- eval.parent(Call$row.names) ap <- eval.parent(Call$appe...
2012 Oct 04
2
How to build a list with missing values? What is missing, anyway?
...b=), quote(a+b), environment()) is equivalent to writing function(a,b) a+b So how do I make the list that goes in the first argument? Suppose I start with a character vector of argument names. What I need is a list with names and quoted values, but the values are "empty". Say I have argnames <- c("a", "b", "c"). >From that I want to construct the equivalent of alist(a=, b=, c=). "missing" seems different from NULL; if I do arglist <- rep(list(NULL), length(argnames)) names(arglist) <- argnames make_function(arglist, quote(a+b+c))...
2008 Oct 24
1
write.csv(..., col.names = FALSE) (PR#13202)
....8.0) OS: Windows NT Submission from: (NULL) (194.127.8.17) Dear R Debug-Team, in write.csv() it is not possible to set both row.names = FALSE, col.names = FALSE since the col.names = FALSE gets overwritten: > write.csv function (...) { Call <- match.call(expand.dots = TRUE) for (argname in c("col.names", "sep", "dec", "qmethod")) if (!is.null(Call[[argname]])) warning(gettextf("attempt to set '%s' ignored", argname), domain = NA) rn <- eval.parent(Call$row.names) Call$col.names <- if (is....
2010 Jul 27
1
problem with zero-weighted observations in predict.lm?
...- predict(fitw, interval="confidence", se.fit=TRUE, newdata=data.frame(x=c(4.5,5.5))) preds <- predict(fits, interval="confidence", se.fit=TRUE, newdata=data.frame(x=c(4.5,5.5))) all.equal(predw, preds) # lots of differences sideBySide <- function (a, b, argNames) { # print objects a and b side by side oldWidth <- options(width = getOption("width")/2 - 4) on.exit(options(oldWidth)) if (missing(argNames)) { argNames <- c(deparse(substitute(a))[1], deparse(substitute(b))[1]) } pa <- cap...
2010 Aug 02
1
Convert an expression to a function
Hi John, Here is my code practicing. Please give me some advises. Thank you. Wu Gong # Extract the function string f.str <- sub("y~","",exprtext) # Get arglist from the text sp1 <- paste("\\",c(getGroupMembers(Arith),"(",")"),sep="") sp2 <- getGroupMembers(Math) sps <-
2019 Jun 04
2
[PATCH libnbd] generator: Fix race condition when validating h->state.
...List.map ( function @@ -2842,8 +2841,6 @@ let generate_lib_api_c () = pr " }\n"; pr "\n" ); - if is_locked then - pr " pthread_mutex_lock (&h->lock);\n"; pr " ret = nbd_unlocked_%s (h" name; let argnames = List.flatten (List.map name_of_arg args) in List.iter (pr ", %s") argnames; -- 2.21.0
2015 Mar 19
2
[LLVMdev] Final added to parser<bool>
.../ FalseParser //===----------------------------------------------------------------------===// class FalseParser : public parser<bool> { public: explicit FalseParser(Option &O) : parser<bool>(O) { } // parse - Return true on error. bool parse(cl::Option& O, StringRef ArgName, StringRef Arg, bool& Val) { if (cl::parser<bool>::parse(O, ArgName, Arg, Val)) return false; Val = false; return false; } }; I don't know the history of this. I'm just starting to do some mclinker work to add the new mips r6 relocations to it. On 03/18...
2012 Apr 13
1
R: Colouring phylogenetic tip labels and/or edges
...ee")#loads tree tree<-chronopl(tree, lambda=1,CV=TRUE) #converts to ultrametric states<-read.delim("states", header=TRUE)#load states head(states) #match states to tree states<-structure(states$PC, names=states$Species) names(states)<-tree$tip.label #MuSSE diversitree:::argnames.musse(NULL, 3) #number of states lik<-make.musse(tree, states, 3) argnames(lik) #contstrain lambda lik.base<-constrain(lik, lambda2~lambda1, lambda3~lambda1, mu2~mu1,mu3~mu1,q13~q12,q21~q12,q23~q12,q31~q12,q32~q12) #find ML point for this model p<-starting.point.musse(tree, 3) fit.base&lt...
2003 Nov 13
4
[LLVMdev] llvm 1.0, g++, SuSE 9, internal compiler error
...ith assert itself. > I would definitely like to put a workaround in the LLVM code, assuming it's not > too ugly. Compatibility with a broad range of compilers is important, > even if they are buggy. :) I see. The following ugly workaround helps: #ifdef NDEBUG bool b = getOption(ArgName) == Opt ; assert( b && "Arg not in map!"); #endif Well, one could camouflage this :) -- vak
2011 Mar 04
4
How two compare two matrixes
Dear all I have two 10*10 matrixes and I would like to compare theirs contents. By the word content I mean to check visually (not with any mathematical formulation) how similar are the contents. I also know edit that prints my matrix in the scree but still one edit blocks the prompt to launch a second edit() screen. What is the best way to compare these two matrices? I would like to thank you
2019 Aug 14
4
[PATCH libnbd 0/2] Use free callback to dereference NBD.Buffer.
In this patch series we use the newly introduced free callback on the completion function to dererence the OCaml NBD.Buffer. I will make the same kind of change for Python later in a separate series. The completion function is always called at the C level, even if the OCaml program didn't use the optional argument. That's because the free callback doesn't run otherwise. There is a
2010 Sep 15
1
retrieving object names passed indirectly to a function
...function, call it foo, that takes a number of arguments which it uses as parameters for a simulation. For later analysis, foo stores the names of the objects passed to it along with the simulation results in its output (written to a database). The objects names are accessed with deparse(substitute(argname)). A second function, call it foo.driver, takes as input a data.frame with cols corresponding to foo arguments containing the character names of objects. For each row of the data.frame in turn, it retrieves the required objects from the global environment and passes them to function foo. Where I...
2010 Aug 12
2
Append to csv without header
Hi, I am writing a function that writes to a csv file for every call. However, for the subsequent calls, I want to append the data to the existing csv file without appending the column names again. I tried searching in the previous posts, but I am stuck with different errors. Here is what I am doing (dataF is a data-frame):- outputFilePath <- paste(getwd(), "/",
2015 Mar 19
2
[LLVMdev] Final added to parser<bool>
...----------------------------------------------------------------===// > class FalseParser : public parser<bool> { > public: > explicit FalseParser(Option &O) : parser<bool>(O) { } > > // parse - Return true on error. > bool parse(cl::Option& O, StringRef ArgName, StringRef Arg, bool& Val) { > if (cl::parser<bool>::parse(O, ArgName, Arg, Val)) > return false; > Val = false; > return false; > } > }; > > I don't know the history of this. I'm just starting to do some mclinker work > to add the ne...
2019 Jul 24
0
[PATCH libnbd 1/3] generator: Change Closure so it describes single callbacks.
...cbname - ) cls; + pr " caml_remove_generational_global_root (user_data);\n"; pr " free (user_data);\n"; pr "}\n"; pr "\n" ); - List.iter ( - fun { cbname; cbargs } -> - let argnames = - List.map ( - function - | ArrayAndLen (UInt32 n, _) | BytesIn (n, _) + let argnames = + List.map ( + function + | ArrayAndLen (UInt32 n, _) | BytesIn (n, _) | Int n | Int64 n | Mutable (Int n) | S...
2012 Oct 23
0
[LLVMdev] dyld: lazy symbol binding failed: fast lazy bind offset out of range
On Oct 23, 2012, at 1:57 PM, Jack Howarth wrote: > Nick, > Can I do this without access to a debug version of dyld? Using the copy of LLVMPolly.so with isl/cloog-isl/gmp statically linked, > I find that if I set the breakpoint to the address of the initializer... > > dyld: calling initializer function 0x100ebb3a0 in /sw/opt/llvm-3.2/lib/LLVMPolly.so > dyld: lazy symbol binding
2019 Aug 13
12
[PATCH 0/6] Implement OClosure.
Patches 1-4 are basically uncontroversial, straightforward refactoring and IMHO we should just push them. Possibly 1-3 should be squashed together, but I posted them separately so they are easier to review. Patches 5 and 6 together implement OClosure. Patch 5 adds the feature and is simple to understand. Patch 6 changes the Closure completion callbacks into OClosure, but because it doesn't
2010 Dec 01
2
default arguments and '...' in a function
Dear R-users, I'm trying to work out a way to set default values for arguments in a function which includes the optional argument '...'. In practice, I have a 'plot' method for a function which specifies different types of plots. Every different plot should have different default arguments (for example for 'col', 'ylim' etc), plus the argument '...' to
2012 Oct 23
2
[LLVMdev] dyld: lazy symbol binding failed: fast lazy bind offset out of range
...e<llvm::PluginLoader, false, true>::setValue<std::string> (this=0x143497418, V=@0x7fff5fbfe780, initial=false) at CommandLine.h:1072 #19 0x0000000142213271 in llvm::cl::opt<llvm::PluginLoader, false, llvm::cl::parser<std::string> >::handleOccurrence (this=0x1434973e0, pos=2, ArgName={Data = 0x1413259f1 "load=/sw/src/fink.build/llvm32-3.2-0/llvm-3.2/build/lib/LLVMPolly.so", Length = 4, static npos = 18446744073709551615}, Arg={Data = 0x1413259f6 "/sw/src/fink.build/llvm32-3.2-0/llvm-3.2/build/lib/LLVMPolly.so", Length = 63, static npos = 18446744073709551615...
2015 Mar 19
3
[LLVMdev] Final added to parser<bool>
...----------===// > > class FalseParser : public parser<bool> { > > public: > > explicit FalseParser(Option &O) : parser<bool>(O) { } > > > > // parse - Return true on error. > > bool parse(cl::Option& O, StringRef ArgName, StringRef Arg, > bool& Val) { > > if (cl::parser<bool>::parse(O, ArgName, Arg, Val)) > > return false; > > Val = false; > > return false; > > } > > }; > > > > I don't know the h...