search for: 1000,2

Displaying 20 results from an estimated 52 matches for "1000,2".

Did you mean: 1000,1
2006 Aug 11
2
AgentcallbackLogin()
Can someone tell me why this is not valid... [start] exten => 1000,1,Answer exten => 1000,2,Wait,1 exten => 1000,3,AgentcallbackLogin(1000||2000@Local) exten => 2000,1,Macro(DialProxy,115551212) exten => 3000,1,Queue(testq||||45) while this is: [start] exten => 1000,1,Answer exten => 1000,2,Wait,1 exten => 1000,3,AgentcallbackLogin(1000||200...
2003 Aug 07
1
MWI bug ?
Hi Lee, You need to specify the VM context that you are using.. so using your examples.. extensions.conf entry.. exten => 1000,1,Dial(SIP/1000,20) exten => 1000,2,Voicemail2(u1000) exten => 1000,102,Voicemail2(b1000) exten => 1000,103,Hangup should be.. exten => 1000,1,Dial(SIP/1000,20) exten => 1000,2,Voicemail2(u1000@sip) exten => 1000,102,Voicemail2(b1000@sip) exten => 1000,103,Hangup and.. exte...
2012 Sep 28
1
Crosstable-like analysis (ks test) of dataframe
...each other. For the comparison I want to use the ks.test(). The result should contain as row and column names the column names of the input dataframe and the cells should be populated with the p-value of the ks.test for each pairwise analysis. My data.frame looks like: df <- data.frame(X=rnorm(1000,2),Y=rnorm(1000,1),Z=rnorm(1000,2)) And the test for one single case is: ks <- ks.test(df$X,df$Z) where the p value is: ks[2] How can I create an automatized way of this pairwise analysis? Any suggestions? I guess that is a quite common analysis (probably with other tests). cheers, Johannes
2011 Jul 05
2
Stuck ...can't get sapply and xmlTreeParse working
...c("Address", "Township", "Parcel", "SaleDate", "Costs"); rownames(tbl) <- NULL v <- gregexpr("( aka )|( AKA )",tbl$Address) s <-sapply(v, function(x) max(unlist(x))) tbl$Address <- substring(tbl$Address, ifelse(s== -1, 0, s+4), 10000) tbl$Cost <- gsub(',', '', tbl$Costs) temp <- strsplit(tbl$Cost, "\\$") temp <- do.call(rbind, temp) # create a matrix mode(temp) <- 'numeric' tbl$Debt <- round(temp[, 2]/1000,2) tbl$Court <- round(temp[, 3]/1000,2) z <- data.frame(substr...
2008 Jan 31
7
pulling my hair out over voicemail
...oming voip. Last week I got everything setup, calls were working, etc.,. I cam across a tutorial for voicemail, followed it, and it worked. When I call my phone and dont answer, it goes to voicemail, and message is stored on server. I created an extension to retrieve the messages: exten => 1000,1,Ringing exten => 1000,2,Wait(2) exten => 1000,3,VoicemailMain And that worked. Granted, everything is still defaults, so when I dial 1000, I get the "Comedian Mail" greeting, then it prompts for mailbox and password, then I get the menu. Now, here is how it gets weird. Today I...
2004 Dec 06
1
Another "Unable to create channel of type 'Zap' (cause 0)" error
...o exten => 613,4,Hangup If I pick up the BT101, and dial 613, sure enough I get the echo test.. All good. I have a TDM400 Card with a single FXO port on it. ztcfg -vv recognises the card as "FXS Device" (I think that's right though...??) I want to know how to get, say extension 1000 to dial a number on the FXO card.. ie: exten => 1000,1,Answer exten => 1000,2,Dial(Zap/1:555-1234,20,tr) exten => 1000,3,Hangup That should work, shouldn't it? Well it doesn't :-) Hence the error in the subject of this message!.. I'm a total noob, but once I get my head aro...
2005 Feb 17
1
Having trouble with extensions in an include file and retrieve_extensions_from_mysql.pl
...ded to try out the contributed script /usr/src/asterisk/contrib/scripts/retrieve_extensions_from_mysql.pl I edited the script so that its output goes to a separate extensions_from_mysql.conf file. The resulting extensions_from_mysql.conf file looks something like this: [vp_context] exten => 1000,1,Record(/tmp/rec:gsm) ; exten => 1000,2,Playback(/tmp/rec) ; exten => 1000,3,Background(goodbye) ; exten => 1000,4,Hangup() ; I decided to #include this in my main extensions.conf, like so: [main_vp_context] exten => s,1,Answer #include <extensions_from_mysql.conf&g...
2011 Jul 13
1
Connect Avaya to Asterisk PBX
...9) exited non-zero on 'OOH323/(null)-b7db8aa0' in macro 'hangupcall' == Spawn extension (default, h, 1) exited non-zero on 'OOH323/(null)-b7db8aa0' *Here is also the content of my extensions_custom.conf:* [general] static=yes autofallthrough=yes [internal] exten => 1000,1,Dial(SIP/1000) exten => 1000,2,HangUp() exten => _XXXX,1,Dial(H323/${EXTEN}@Avaya) exten => _XXXXXXXXXXX,1,Dial(H323/${EXTEN}@Avaya) exten => _XXXXXXXXXX,1,Dial(H323/${EXTEN}@Avaya) *Here is also the content of my ooh323.conf:* [general] faststart=yes h245tunneling=yes gatekeeper=D...
2004 Aug 17
4
Hunt Groups
I have a question about how Asterisk Parses the Dial Plan. To create a hunt-group which would be the appropriate dial plan: [CompanyABC] exten => 7228888,1,Dial(SIP/8017228888,60,r) exten => 7228888,102,Dial(SIP/8014361234,60,r) exten => 7228888,103,Dial(SIP/8014362345,60,r) exten => 7228888,104,Dial(SIP/8014363456,60,r) exten => 7228888,105,Dial(SIP/8014364567,60,r) exten
2004 Dec 19
1
Make asterisk launch script after completing call.
...ld be nicer. How is it done? [outgoing] exten => _0.,1,SetVar(CALLFILENAME=${EXTEN:1}-${TIMESTAMP}) exten => _0.,2,Monitor(wav,${CALLFILENAME},m) exten => _0.,3,Dial(SIP/rix/${EXTEN}|20|t) exten => _0.,4,Congestion exten => _0.,104,Congestion [sip-in] exten => 1000,1,SetVar(CALLFILENAME=${EXTEN:1}-${TIMESTAMP}) exten => 1000,2,Monitor(wav,${CALLFILENAME},m) exten => 1000,3,Dial(SIP/alex,20) exten => 1000,4,Voicemail(u1000) -- Alex Polite http://polite.se
2008 Aug 07
1
incorrect usage of glmer crashes R (PR#12375)
Full_Name: susscorfa Version: 2.7.1 OS: ubuntu Submission from: (NULL) (129.125.177.31) Incorrect implementation of the grouping variable in the function glmer crashes R a small example: require(lme4); a<-data.frame(b=rpois(1000,10), c=gl(20,50), d=rnorm(1000,3), e=rnorm(1000,5), f=rnorm(1000,2)+5); glmer(b~d+f|c+(e), family=poisson, data=a) It crashes R on debian linux (2 independant systems) as well as windows The correct function usage is: glmer(b~d+f+(e|c), family=poisson, data=a) I suppose it should just eveluat...
2012 Sep 24
1
Adding textbox to multiple panels in lattice
...t;Female"){ panel.pyramid(x,y,...) iCc <- with(iFrame,unique(cc)) iYr <- with(iFrame,unique(yr)) totpop <- round(sum(abs(subset(iEduDat,cc==iCc & yr==iYr,select=value)))/1000,2) LAB <- paste("Pop = ",totpop," Mio",sep="") xr <- max(abs(subset(iEduDat,cc==iCc,select=value))) xr <- xr - xr * 0.005 panel.text(x=xr,y=max(y)-2,lab=LAB,cex=0.7,pos=2)...
2004 Jul 09
1
No data when recording a Meetme conference with Monitor
I'm trying to record a Meetme conference to disk, but the Monitor application doesn't seem to play nicely with Meetme. In extensions.conf, I have this: exten => 1000,1,Answer exten => 1000,2,Monitor exten => 1000,3,Meetme This starts up the monitoring OK, and it records the prompts that Meetme gives, but as soon as the user enters the conference, the -out WAV file stops being updated. The -in file is updated, and has the right data in it. I've a...
2008 Apr 03
1
Sending audio to a channel
I have a voicemail application that users can listen to messages and leave messages. I am looking for a way to play a beep tone to a user when a new message is received when they are on the phone. Here is what I have come up with: in extensions.conf: [beepvoicemail] exten => 1000,1,answer() exten => 1000,2,NoCDR() exten => 1000,3,wait(2) exten => 1000,4,Set(TIMEOUT(absolute)=5) exten => 1000,5,playback(voicemail/beeps) exten => 1000,7,SendDTMF(9) exten => 1000,8,hangup() exten => 2000,1,Set(TIMEOUT(absolute)=5) exten => 2000,2,NoCDR() exten => 20...
2007 May 11
0
EM covergence problem
...use EM algorithmto estimate a latent class model of discrete choice. The basic model is a logit model which has two variables X=(X1,X2) and the utility is defined as v = Beta*X. There are 3 classes of individuals each has its own Beta values, so Beta is a 3*2 matrix. For each individual, (there are 1000), he make a choice between two randomly generated choice alternatives and has to choose one. The proportion of classes is set to (0.2,0.5,0.3). based on this seting, the proportion parameters alpha always end up with one of them goes to 0 in EM estimation. I checked the code and can not find what...
2012 Jul 26
1
loop for, error: obj type 'closure' not subsetable
Hi everyone, I've got the following problem: I've got a matrix [1000,2] and two vectors. In very matrix row there is two coefficients b0 and b1. The vectors are two variables x and y. I want to do a loop to take b0 and b1 and with x and y calculate the residual of a linear model and calculate the second order coefficient of autocorrelation. What I did is : rho&lt...
2006 Apr 20
1
Background() and Read()
...w stack -- Executing Wait("SIP/2944093-6437", "1") in new stack -- Executing BackGround("SIP/2944093-6437", "if-u-know-ext-dial") in new stack -- Playing 'if-u-know-ext-dial' (language 'en') Here's extensions.conf: exten => 1000,1,Answer exten => 1000,2,Wait,1 exten => 1000,3,Background(if-u-know-ext-dial) exten => 1000,4,Read(number||||||) exten => 1000,5,NoOp(${number}) Anyone got any ideas?
2004 Jul 19
4
TDM400P Internal Extenion Config
...callerid=asreceived channel => 1 context=internal group=2 signalling=fxo_ks callerid="Fax" <310> channel => 2 extensions.conf [general] static=yes writeprotect=no [globals] [sip] exten => 301,1,Dial(SIP/Nick,20,tr) exten => 302,1,Dial(SIP/Sharon,20,tr) exten => 1000,1,Dial(SIP/Nick&SIP/Sharon,20,tr) exten => 302,2,VoiceMail,u302 exten => 301,2,VoiceMail,u301 exten => 1000,2,VoiceMail,u9999 exten => 1000,102,VoiceMail,b9999 exten => 1001,1,Ringing exten => 1001,2,Wait(2) exten => 1001,3,VoicemailMain include => outgoing [incoming] e...
2003 May 05
3
G723 - Has anyone gotten SIP_CODEC= to work?
...n I try it I keep getting the following: chan_sip.c ...(sip_answer):Changing codec to GSM for this call because of ${SIP_CODEC} variable channel.c ..(ast_set_write_format): Unable to find a path from 2 to 1. Any ideas? sip.conf disallow=all allow=g723.1 allow=gsm extensions.conf exten => 1000,1,SetVar,SIP_CODEC=gsm exten => 1000,2,VoiceMailMain _______________________________________________ Asterisk-Users mailing list Asterisk-Users@lists.digium.com http://lists.digium.com/mailman/listinfo/asterisk-users
2003 Sep 23
1
App_festival crashing
...7466]: File app_festival.c, Line 381 (festival_exec): Passing text to festival... WARNING[147466]: File app_festival.c, Line 390 (festival_exec): Writing result to cache... WARNING[147466]: File app_festival.c, Line 400 (festival_exec): Passing data to channel... == Spawn extension (home-trusted, 1000, 3) exited non-zero on 'SIP/bsenicar-850b' In festival.conf I enabled all 5 default options and my extensions.conf looks like this: [home-trusted] exten => 1000,1,answer exten => 1000,2,SayDigits(123) exten => 1000,3,Festival(Connect to Festival) exten => 1000,4,Wait(5) exten...