search for: 100,1

Displaying 20 results from an estimated 246 matches for "100,1".

Did you mean: 100,7
2005 Mar 19
2
Goto and E1 line
...th 2 TE110P cards. 1 card is plugged to telco line, another card is plugged with a Hicom PBX. I want to send some call to VoIP phones and all other to my PBX. I don't known how to make my dialplan : ===========Extensions.conf========== [incoming_call] exten => 090200000,1,Goto(callcenter,100,1) exten => 022956353,1,Goto(callcenter,100,1) exten => 022956388,1,Goto(callcenter,100,1) exten => 022956355,1,Goto(callcenter,101,1) exten => s,1,Goto(go_to_pbx,200,1) [callcenter] exten => 100,1,Answer exten => 100,2,SetMusicOnHold(default) exten => 100,3,DigitTimeout,5 ext...
2007 Aug 15
3
Formula in lm inside lapply
...of observations using the lapply function. It works fine when I write the formula inside the lm() function. But I would like to pass formulae into lm(), so I can do multiple models more easily. I got an error message when I tried to do that. Here is my sample code: #generating data x1 <- rnorm(100,1) x2 <- rnorm(100,1) y <- rnorm(100,1) group <- rep(c("A","B"),c(40,60)) group <- factor(group) df <- data.frame(y,x1,x2,group) #write formula inside lm--works fine res1 <- lapply(levels(df$group), function(x) lm(y~x1,df, subset = group ==x)) res1 res2 <-...
2009 Dec 02
1
Generate missing data patterns
Dear R-users, i try to generate missing values in a matrix X according to a given missingnes pattern R with the probabilities p per row. X<-matrix(rnorm(3*100),ncol=3) ## indicator matrix for missingnes (1 observed, 0 missing) R<-matrix(c(1,1,1, 0,0,1, 1,1,0, 0,1,1),ncol=3,byrow=TRUE) ## probabilities for row 1, row 2, row 3 and row 4 p<-c(0.375,0.25,0.25,0.125) ## does not exactly what i want, because i get r...
2005 Jan 27
2
Q: Can I over-ride the value of ${CALLERIDNAME} ?
...I would prefer to display "ROB CELL" instead of "CELLULAR CALL" when I call home from my cell phone. This is what I tried in the context which handles inbound PSTN calls: ... exten => s/3125882300,1,SetVar(CALLERIDNAME="ROB CELL") exten => s/3125882300,2,Goto(100,1) exten => 100,1,Macro(exten_vm,Zap/1) ... The "exten_vm" macro context handles calls to extensions equipped with voice mail. When I make a call from my cell phone, the telephone caller ID unit shows "CELLULAR CALL" instead of "ROB CELL". Does anyone have any...
2006 Sep 27
1
histogram colors in lattice
I have code that constructs a plot using the lattice package that looks something like the following toy example: library(lattice) Start <- factor(rbinom(100,1,.5)) Answer <- 2 - rbinom(100,1,.7) histogram(~Answer | Start, breaks=c(1, 1.4 ,1.6,2), scales=list(x=list(at=c(1.2,1.8),labels=c("Yes","No"))), xlab="",ylab="") I would like to have different colors for the bars in the le...
2011 Apr 04
1
MeetMe headache
Ok, I've been running applications on 1.4 for quite some time using meetme to hold a person, while the person on the other end of the call accepts, etc. I was playing status messages to the calling party using a context like this: [status-one-en] exten => 100,1,Playback(my_status_message) exten => 100,1,Hangup() and then creating a call file like this: Channel: Local/100 at status-one-en CallerID: Rick <5555555555> MaxRetries: 0 RetryTime: 15 WaitTime: 45 Application: MeetMe Data: 12345,qdM and it would hook into the meetme, play the message...
2005 Mar 16
1
Code to replace nested for loops
Dear list members, How can I replace the nested for loops at then end of the script below with more efficient code? # Begin script__________________________________________________ # Dichotomous scores for 100 respondents on 3 items with # probabilities of a correct response = .6, .4, and .7, # respectively x1 <- rbinom(100,1,.6) x2 <- rbinom(100,1,.4) x3 <- rbinom(100,1,.7) # 'theta.vec' is a vector holding 31 possible levels of theta # ranging from -3 to +3 in intervals of .2. theta...
2005 May 10
1
Group dial, first phone cannot pickup call. Cisco 7905 hangs.
I have a simple dial plan to cascade calls when the first phone does not answer: exten => 100,1,Dial(SIP/1000,10,tr) exten => 100,2,Dial(SIP/1000&SIP/1001,10,tr) exten => 100,3,Dial(SIP/1000&SIP/1001&SIP/1002,10,tr) exten => 100,4,Voicemail(u100) Problem is that the once the call goes onto the second and subsequent steps exten 1000 cannot answer the call. When the user...
2017 Mar 15
3
Crear una función
...mine de cerrar y mi manejo no permite que el google me ayude... n.reg.dep <- function(x, y) { etiqueta <- str_replace(nombres[Variable == y, Descripcion], "[ ]", "") tabla <- datos[, .N, by = .(etiqueta = A3a)] # tabla <- tabla[, Porc := round(N/sum(N)*100,1)] # % tabla[, PorcAc := cumsum(Porc)] # Regiones tabla.1 <- datos[, .N, by = .(etiqueta = x, Region)] tabla.1[, Porc := round(N/sum(N)*100,1), by =.(Region)] tabla.1 <- spread(tabla.1[, .(etiqueta, Region, Porc)], key = Region, value = Porc)...
2013 Apr 15
3
Dial multiple device cancellation
Hi, Can a call to multiple devices be cancelled in all of them at same time? With next dialplan, exten => 100,1,Dial(SIP/101&SIP/102) when a call rings on 101 and 102 and one of them rejects the call "with 486 Busy here", is it possible to reject the call in the other device at same time? I read application dial options but I can't find any that can help me to achieve this behavior. Tha...
2011 Jul 14
5
Splitting one column value into multiple rows
Hi i have the data in the following format: rent,100,1,common,674 pipe,200,0,usual,864 car,300,1,uncommon,392:jump,700,0,common,664 car,200,1,uncommon,864:snap,900,1,usual,746 stint,600,1,uncommon,257 pull,800,0,usual,594 where as i want the above 6 lines data into 8 lines as below (Spliting row 3 & 4 at : and sending to a new row): rent,100,1,...
2009 Dec 10
2
different randomForest performance for same data
...t;) # import traindat and testdat > nlevels(traindat$predictor1) [1] 20 > nlevels(testdat$predictor1) [1] 19 > nrow(traindat) [1] 9838 > nrow(testdat) [1] 3841 > set.seed(10) > rf_orig <- randomForest(x=traindat[,-1], y=traindat[,1], xtest=testdat[,-1], ytest=testdat[,1],ntree=100) > data.frame(rf_orig$test$err.rate)[100,1] # Error on test-dataset [1] 0.3082531 # assign the levels of the training dataset th the test dataset for predictor 1 > levels(testdat$predictor1) <- levels(traindat$predictor1) > nlevels(traindat$predictor1) [1] 20 > nlevels(testda...
2010 Jan 07
1
"diag", "diag<-" and "[" , "[<-"
Dear all I have the following problem. M <- matrix(0,3,3) # dimension of M is dinamic and this can lead to the next subscript diag(M[1,1]) <- rep(100,1) #Error in `diag<-`(`*tmp*`, value = 100) : # only matrix diagonals can be replaced diag(M[1,1,drop=F]) <- rep(100,1) #Error in diag(M[1, 1, drop = F]) <- rep(100, 1) : # incorrect number of subscripts diag(M[2:3,1:2]) <- rep(100,2) # works fine Is there a way to usw diag as replac...
2009 Sep 29
3
Equivalent for Matematica function Which...
Dear All! I'm looking for equivalent of Matematica function "Which" which works as follows: z = Which[x<10,0.3, 10<=x<20,0.5, 20<=x<100,1] where x is a vector I can replace it with custom function with set of ifelse but I'm looking for simpler and faster (much faster) solution best wishes Jarek
2005 Mar 08
1
Dial() out and offer a menu system
Hello all! I'd like my * to call out to somebody and offer the called party a menu system. Everything should just be as if the called party had initiated the call themselves. This is my try: exten => 100,1,Dial(Modem/g1:0555321) exten => 100,2,Goto(mainmenu,s,1) This doesn't really work, because the Dial cmd blocks further execution until the called party hangs up. Next try: [macro-incom] exten => s,1,Goto(mainmenu,s,1) exten => 100,1,Dial(Modem/g1:0555321,7,gtTHM(incom)) Doesn...
2007 Jan 17
1
2 Questions: Answer with music don't work and Voicemail direct access ?
Hi I have two small question, if you can help me ;=) Problems with Answer+Music my extension: [Cal-In] exten => _811XXXX20,1,Goto(C-Internal,100,1) exten => _811XXXX21,1,Goto(C-Internal,200,1) [C-Phibee] exten => 100,1,Ringing exten => 100,2,Wait,1 exten => 100,3,Answer exten => 100,4,Dial(SIP/201&SIP/200,30) exten => 100,5,Hangup exten => 200,1,Ringing exten => 200,2,Wait,1 exten => 200,3,Answer ex...
2004 Jan 06
3
MWI message not seen on SNOM200
...ers/attachments/20040106/3efdeb9f/attachment.htm -------------- next part -------------- Hello Though my SNOM 200 phone receive a voice mail but it doesn't show MWI on the LCD panel, Instead it keeps displaying "DND SW-REG,Call-log". Though I can access my voicemail using exten =>100,1,VoicemailMail() Current firmware on SNOM 200 is SNOM200-SIP 2.03h Am I missing something. Regards Tony
2014 Sep 01
1
SIP Calls Not Working
...ons.conf and now we asterisk 1.8.29.0, so these phones have stopped communicating. My question is that does 1.8.29.0 release require any more changes to be done to the sip.conf and extensions.conf to make the below work ? The sip.conf contains following enteries ================================== [100] type=friend username=100 secret=100 host=dynamic port=5060 dtmfmode=rfc2833 fromdomain=dynamic nat=no canreinvite=false context=exten-100 [101] type=friend username=101 secret=101 host=dynamic port=5060 dtmfmode=rfc2833 fromdomain=dynamic nat=no canreinvite=false context=exten-101 The extensions...
2005 Apr 20
1
negative p-values from fisher's test (PR#7801)
...using fisher's test on 2 x c tables and a very small p.value from fisher's test (<2.2e-16) is returned as a negative number. Code follows. > set.seed(0) > nreps.outer <-7 > pvalue.fisher <- rep(NA,nreps.outer) > > population1 <- c( rep("A",300),seq(1:100)) > > population2 <- c( rep("A",100),seq(101:200)) > > > for (j in 1:nreps.outer){ + n1 <- sample(30:100,1) + n2 <- sample(30:100,1) + + group1 <- sample(population1, n1, replace=T) + group2 <- sample(population2, n2, replace=T) + + pvalue.fisher[j] &lt...
2005 Jun 15
3
Includes include the includes?
I am grouping my extensions by building like so: 1XX is Building 1 2XX is Building 2 7XX is Office [Office] extensions has the following includes 7xx Include => Local Include => International Include => Building1 Include => Building2 [Building1] has 1xx Include => Office Include => Building2 Include => Local I done't want building1 to access international, but does