Displaying 20 results from an estimated 32 matches for "mycall".
Did you mean:
mccall
2008 Sep 24
1
function can permanently modify calling function via substitute?
...f it is really intended. (I can
see other ways to accomplish the intended task of this code [e.g. via
match.call instead of substitute below] that do not trigger the
problem, but I don't think that is the point.)
do.nothing <- function(blah) {force(blah)}
do.stuff.with.call <- function(mycall) {
raw.mycall <- substitute(mycall); # expected raw.mycall would be local
print( sys.call() )
# do.nothing( raw.mycall ); # See below re: commented lines.
# .Call( "showNAMED", raw.mycall[[2]] )
force( mycall ); # not relevant where (or whether) this is done
raw.mycal...
2004 May 07
1
meetme conf-background.agi
...****************************************************
#!/usr/bin/perl -w
$aginame="conf-background.agi";
use File::Copy cp;
use Asterisk::AGI;
$AGI = new Asterisk::AGI;
my %input = $AGI->ReadParse();
print STDERR "Dialing your number\n";
$srcfile="/tmp/mycall";
$dstfile="/var/spool/asterisk/outgoing/mycall";
open(MYCALL,">$srcfile") || die "Cant't open file :$srcfile $!\n";
print MYCALL "Channel:Zap/1/13\n";
print MYCALL "MaxRetries:2\n";
print MYCALL "RetryTime:60\n";
print M...
2004 May 10
1
AGI.pm wait_for_digit() not working for me!!!
...har('600');
$char=chr($AGI->wait_for_digit('600'));
print STDERR "input form rec char : $char\n";
if($char eq "*")
{
print STDERR "Dialing your number\n";
$srcfile="/tmp/mycall";
$dstfile="/var/spool/asterisk/outgoing/mycall";
open(MYCALL,">$srcfile") || die "Cant't open file :$srcfile
$!\n";
print MYCALL "Channel:IAX2/bali:bali\@nain/25\@atif\n";
print...
2009 Nov 03
1
likely bug in 'serialize' or please explain the memory usage
...as the example below
demonstrates (runnable). This is a problem for parallel computing. The
problem described below is actually a problem for Rmpi and any other
parallel implementation we tested leading to endless executions in some
cases, where the total data passed is huge.
Assume the below 'mycall' is the function that takes data and a function
object, serializes them and calls the remote host. To make it runable I
just print the size of the serialized objects. In a parallel apply
implemention it would serialize individual list elements and a function
and pass those over. Assuming 1 elem...
2003 Oct 23
3
List of lm objects
...John Fox, Spencer Graves and Peter
Dalgaard proposed and discused yesterday on this e-mail list:
for (y in df[, 3:5]) {
mod = lm(y ~ Trt*Dose, data = x, contrasts = list(Trt =
contr.sum, Dose = contr.sum))
Anova(mod, type = "III")
} ## by John Fox
or
for (myname in names(myframe)){
mycall <- substitute(lm(myvar~etc.etc.....),list(myvar=as.name(myname)))
myfit <- eval(mycall)
print(summary(myfit))
} ## by Peter Dalgaard
But instead of printing summary or Anova results, I need to generate a list
containing all the lm() objects.
Is that possible? How?
Thanks, Gabriela.
2002 Mar 22
2
rare bad bug in sys.function() {or match.arg()} (PR#1409)
...clean example :
#### bad match.arg() // sys.function() bug :
#### MM, 22.3.2002
callme <- function(a = 1, mm = c("Abc", "Bde")){
mm <- match.arg(mm)
cat("mm = "); str(mm)
invisible()
}
## These are as desired
callme()
callme(mm="B")
mycaller <- function(x = 1, callme = pi) {
callme(x)
}
mycaller()
##-> mm = NULL
## but should give "Abc !!
-------
Explanation :
In match.arg(), there's
formal.args <- formals(sys.function(sys.parent()))
and you can check that sys.function(sys.parent())
gives the numbe...
2001 Nov 09
1
One package calling C-code from another package.
Dear R people
We have two packages, where the first package (geoR) is required by the
second (geoRglmm).
Both packages have functions calling C-code via .C().
We would like to call C-functions included in the first package
from within the C-code in the second package.
Is this possible?
An appropriate header file was included in the src directory of the
second package but this alone did not
2003 Oct 10
1
number of arguments in .Call function registration
...uggested that r-devel would also find it interesting.
Many of us use a macro like
#define CALL_DEF(fname, nargs) { #fname, (DL_FUNC)&fname, nargs}
for use in function registration for use with .Call.
For example, using the example from R Extension manual,
if we want to register a C function myCall with three arguments, we
will use
R_CallMethodDef callMethods[] = {
CALL_DEF(myCall, 3),
{NULL, NULL, 0}
};
instead of using
R_CallMethodDef callMethods[] = {
{"myCall", (DL_FUNC)&myCall, 3},
{NULL, NULL, 0}
};
However, there is no way for the compiler to make sure...
2006 Jul 28
3
ActionWebService Struct member name including ''-''
Hi
I am tryng to mirror a locked away, secure web service for testing
purposes and am almost there. Hoever as part of the definition for the
structure of the call to the webservice, I have this struct.
class MyCall < ActionWebService::Struct
member :username, :string
member :password, :string
member :"remote-ip", :string
end
However this does not work... Should :"remote-ip" be a valid member
name?
I get the following syntax error
SyntaxError ((eval):1:in `member''...
2001 May 30
2
environments
...ion, and
use it as part of a formula as an argument to, say, gnls or nlme. for
example:
MyTop <- function(data=dta) {
Cexp <- function(dose,A,B,m){...}
Model <- as.formula(paste("y","~ Cexp(",paste(formals(Cexp),collapse
=", "),")"))
MyCall <- call("gnls",Model,dta,...)
eval(MyCall)
}
where "..." indicates I've left out unimportant details. In practice, the
function Cexp would be the result of some computations.
When I actually try this, I get an error return with the message "Cexp not
found&quo...
2018 Sep 12
3
hangup the _called_ channel ?
I understand that HangUp() hangs up the calling channel. I want to
hangup the called channel.
SIP/mycall-xxxxx calls and bridges with DAHDI/1-1.
I send SIP/.... to listen to a long, very long, file.
GoSub(play-long-file,s,1)
[play-long-file]
exten=s,1, ;;; Here I want to hangup DAHDI/1-1, the called channel
same=n,Playback(very-long-file)
same=n,Hangup()
How do I hangup the called channel, and l...
2012 Jul 27
1
Version of substitute that evaluates it's first argument
Hi all,
Does there already exist a version of substitute that evaluates it's
first argument? (i.e. it accepts an already quoted expression). This
seems like something that's pretty handy, but I haven't found any
existing function to do it:
substitute_e <- function(expr, env) {
eval(substitute(substitute(expr, env), list(expr = expr)))
}
f <- quote(x + y + z)
substitute(f,
2005 Jun 03
2
dot in formula
gReetings,
I want to manipulate a formula object, containing the name "."
so that "." is replaced by a desired (arbitrary) expression.
What is a safe way to do this?
Adrian Baddeley
2010 Apr 13
0
Multicore mapply
...ots)==1) {
ans <- mclapply(dots[[1]], FUN, mc.preschedule=mc.preschedule,
mc.set.seed=mc.set.seed, mc.silent=mc.silent, mc.cores=mc.cores)
} else {
l <- length(dots[[1]])
if (any(sapply(dots,length)!=l)) stop("Arguments must be lists of the
same length")
elem <- mycall <- vector("list", l)
for (i in 1:length(elem)) {
elem[[i]] <- lapply(dots, "[[", i)
mycall[[i]] <- paste("do.call(FUN, elem[[",i,"]])",sep="")
}
ans <- mclapply(mycall, function(z) eval(parse(text=z)),
mc.presched...
2010 Aug 12
3
[LLVMdev] LLVM-C: Calling functions contained in other libraries
...ar I was able to get, but when my call is invoked, the engine gives me the following message:
LLVM ERROR: Tried to execute an unknown external function: i8* ()* NSFullUserName
I have dumped the module (without the clutter):
declare i8* @NSFullUserName()
define i8* @MyFunction() {
entrypoint:
%myCall = call i8* @NSFullUserName() ; <i8*> [#uses=1]
ret i8* %myCall
}
Where am I going wrong here?
To add some code to my previous question:
LLVMTypeRef i8Ptr(void) {
return LLVMPointerType(LLVMInt8Type(), 0);
}
LLVMValueRef d(LLVMModuleRef module) {
LLVMValueRef result;...
2018 Sep 12
2
hangup the _called_ channel ?
On 9/12/18 1:22 PM, Joshua Colp wrote:
> On Wed, Sep 12, 2018, at 2:19 PM, sean darcy wrote:
>> I understand that HangUp() hangs up the calling channel. I want to
>> hangup the called channel.
>>
>> SIP/mycall-xxxxx calls and bridges with DAHDI/1-1.
>>
>> I send SIP/.... to listen to a long, very long, file.
>
> Define "send". How are you doing it?
>
GoSub(play-long-file,s,1)
[play-long-file]
exten=s,1, ;;; Here I want to hangup DAHDI/1-1, the called channel
same=n,Pla...
2016 Sep 05
2
LLVM 3.8.0 - Adding new instruction to a basic block
...;t
it be
BB->getInstList().insertAfter(InsertPt, new_inst); ?
With insert I currently get the following error:
Instruction does not dominate all uses!
%0 = getelementptr inbounds i8, i8* getelementptr inbounds ([8 x
i8], [8 x i8]* @1, i32 0, i32 0)
call void @myCall(i8* %0)
Regards,
Simona
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://lists.llvm.org/pipermail/llvm-dev/attachments/20160905/39486a30/attachment.html>
2006 Jul 24
1
XMLRPC WebService and Structs
...t;
</member>
</struct>
</value>
</param>
</params>
</methodResponse>
Now, by the looks of things I need to do something like.
class IsCorrectApi < ActionWebService::API::Base
api_method :isValid,
:expects =>[MyCall,{:code=>:string}],
:returns =>[Success,MyResult]
end
class MyCall < ActionWebService::Struct
member :username,:string
member :password,:string
member :remoteip,:string
end
class MyResult < ActionWebService::Struct
member :responseData,:string
end
But you can...
2010 Aug 12
0
[LLVMdev] llvm-c headers: How to call external function?
...ar I was able to get, but when my call is invoked, the engine gives me the following message:
LLVM ERROR: Tried to execute an unknown external function: i8* ()* NSFullUserName
I have dumped the module (without the clutter):
declare i8* @NSFullUserName()
define i8* @MyFunction() {
entrypoint:
%myCall = call i8* @NSFullUserName() ; <i8*> [#uses=1]
ret i8* %myCall
}
Where am I going wrong here?
Thank you,
Filip
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://lists.llvm.org/pipermail/llvm-dev/attachments/20100812/bf15bafc/attachment....
2009 Jun 09
2
calibration curve options
Hi R-users,
can anyone explain me how to play around with the options of the bootstrap calibration curve obtained using the calibrate() function in Design package?
I am trying to colour the diagonal, i.e. the ideal curve, in red, and also hide the bias-corrected curve.
Thanks,
Dave
_________________________________________________________________
Show them the way! Add maps and directions to