search for: step2

Displaying 20 results from an estimated 101 matches for "step2".

Did you mean: step
2009 Jun 03
2
Regular expression \ String Extraction help
...hikers Guide To The Galaxy42.txt My main issue is the conversion for 'Hitchkikers Guide To The Galaxy54' because of the spaces in the Name. So far this is what i have: > txt <- '2009-04-10 1400 Fri Universities1.txt' > step1 <- unlist(strsplit(txt, '\\.')) > step2 <- unlist(strsplit(step1[1], ' ')) > Name <- gsub('[0-9]',replacement='', step2[4]) > step3 <- paste(step2[1], step2[2], step2[3], sep=' ') > paste('C:\\test\\', Name, '\\', step3, '\\', txt, sep='' ) [1] "C:\\te...
2012 Aug 27
2
simplest way (set of functions) to parse a file
...transform a file? My file looks as shown below. I would like to plot this data and I need to parse it into a single data frame that sorts of "transposes the data" with the following structure: > df <- data.frame(n=c(1,1,2,2),iter=c(1,2,1,2),step=as.factor(c('Step 1', 'Step2', 'Step 1', 'Step 2')),value=c(10, 10, 10, 10)) > str(df) 'data.frame': 4 obs. of 4 variables: $ n : num 1 1 2 2 $ iter : num 1 2 1 2 $ step : Factor w/ 3 levels "Step 1","Step 2",..: 1 3 1 2 $ value: num 10 10 10 10 n=extracted from th...
2011 Nov 18
1
couting events by subject with "black out" windows
...;), class = "data.frame", row.names = c(NA, 14L)) ##     remove non events data2 <- data1[data1$event==1,] library(doBy) ##     create a table of first events step1 <- summaryBy(Date~ID, data = data2, FUN=min) step1$Date30 <- step1$Date.min+30                                     step2 <- merge(data2, step1, by.x="ID", by.y="ID") ##     use an ifelse to essentially remove any events that shouldn't be counted step2$event <- ifelse(as.numeric(step2$Date) >= step2$Date.min & as.numeric(step2$Date) <= step2$Date30, 0, step2$event) ##     basica...
2011 Sep 29
2
String manipulation with regexpr, got to be a better way
...his firstslash <- unlist(regexpr("/", dates, fixed = TRUE)) #then use frist/ to cut the string field into an intermediate variable e.g., from 1/1/2008 to 1/2008. step1 <- substr( dates, (firstslash + 1), nchar(dates) ) #then repeat steps 1 and 2...there's got to be a better way step2 <- unlist(regexpr("/", step1, fixed = TRUE)) #then use step2 to cut string into final product e.g., from 1/2008 to 2008. final <- substring(step1,step2 + 1, nchar(step1) )   Thx! C [[alternative HTML version deleted]]
2017 Nov 20
4
Reg an issue with smoothing factor in VAD implementation
...Probability Estimation */ > /*********************************/ > SA_Q15 = silk_sigm_Q15( silk_SMULWB( VAD_SNR_FACTOR_Q16, pSNR_dB_Q7 ) - > VAD_NEGATIVE_OFFSET_Q5 ); // step1: Calculate speech probability : comment > by me > > /* Power scaling */ > if( speech_nrg <= 0 ) { // step2: update speech probability based on > speech energy : comment by me > SA_Q15 = silk_RSHIFT( SA_Q15, 1 ); > } else if( speech_nrg < 32768 ) { > if( psEncC->frame_length == 10 * psEncC->fs_kHz ) { > speech_nrg = silk_LSHIFT_SAT32( speech_nrg, 16 ); // Energy is doubled > he...
2011 Sep 09
2
NMDS plot and Adonis (PerMANOVA) of community composition with presence absence and relative intensity
...ow to interpret it and I get an error message. Then I want to make a PerMANOVA analysis comparing the different treatments with each other. I tried to look at similar problems but I get error messages. Any ideas? #NMDS step1<-read.delim2("day20.txt", row.names=1) library(clusterSim) step2<-data.Normalization(step1,type="n10") step3<-asin(sqrt(step2))*57.3 step4<-t(step3) library(vegan) step5<-data.matrix(vegdist(step4,method="bray")) step6<-metaMDS(step5, autotransform=FALSE) plot(step5) Warning message: In ordiplot(x, choices = choices, type = typ...
2017 Nov 27
3
Reg an issue with smoothing factor in VAD implementation
...*****************/ /* Speech Probability Estimation */ /*********************************/ SA_Q15 = silk_sigm_Q15( silk_SMULWB( VAD_SNR_FACTOR_Q16, pSNR_dB_Q7 ) - VAD_NEGATIVE_OFFSET_Q5 ); // step1: Calculate speech probability : comment by me /* Power scaling */ if( speech_nrg <= 0 ) { // step2: update speech probability based on speech energy : comment by me SA_Q15 = silk_RSHIFT( SA_Q15, 1 ); } else if( speech_nrg < 32768 ) { if( psEncC->frame_length == 10 * psEncC->fs_kHz ) { speech_nrg = silk_LSHIFT_SAT32( speech_nrg, 16 ); // Energy is doubled here : comment by me } else...
2006 Mar 29
1
Help: Input of form 1 to hidden field in form 2?
...o form 2. form two: the 8 digit number from form one becomes a hidden field in form 2. The problem I have is that the entire hash from form 1 is showing up in form two rather than just the input data. example: form 1: <h1>Step 1</h1> <%= start_form_tag :action => ''step2'' %> <%= render :partial => ''form1'' %> <%= submit_tag "Register Tag" %> <%= end_form_tag %> Here is the partial (form1): <!--[form:tag]--> <p> <%= text_field ''tag'', ''tag'' %></...
2008 May 13
1
R help: problems with step function
...e have factor variables with 3 levels. The following run shows the first problem. AICs (* and **) are different. I noticed that the Df for rs13482096:rs13483699 is 4, while I think Df should be 6, 2 from rs13483699 and 4 from interactions. When I ran add1 directly, I got Df=6 and AIC 848.75. > step2.bic.out <- step(step.bic.out, scope=list(lower=scope.lower2, upper=scope.upper2), + direction="both", k=log(length(step.bic.out$y)), trace=1) Start: AIC=841.18 pheno.dat ~ rs13479085 + rs13480057 + rs13482096 + rs8254221 Df Deviance AIC...
2017 Nov 20
0
Reg an issue with smoothing factor in VAD implementation
...*****************/ /* Speech Probability Estimation */ /*********************************/ SA_Q15 = silk_sigm_Q15( silk_SMULWB( VAD_SNR_FACTOR_Q16, pSNR_dB_Q7 ) - VAD_NEGATIVE_OFFSET_Q5 ); // step1: Calculate speech probability : comment by me /* Power scaling */ if( speech_nrg <= 0 ) { // step2: update speech probability based on speech energy : comment by me SA_Q15 = silk_RSHIFT( SA_Q15, 1 ); } else if( speech_nrg < 32768 ) { if( psEncC->frame_length == 10 * psEncC->fs_kHz ) { speech_nrg = silk_LSHIFT_SAT32( speech_nrg, 16 ); // Energy is doubled here : comment by me } else...
2018 Feb 16
1
Reg an issue with smoothing factor in VAD implementation
...****/ > SA_Q15 = silk_sigm_Q15( silk_SMULWB( VAD_SNR_FACTOR_Q16, > pSNR_dB_Q7 ) - VAD_NEGATIVE_OFFSET_Q5 ); // step1: Calculate > speech probability : comment by me > > /* Power scaling */ > if( speech_nrg <= 0 ) { // step2: update speech probability > based on speech energy : comment by me > SA_Q15 = silk_RSHIFT( SA_Q15, 1 ); > } else if( speech_nrg < 32768 ) { > if( psEncC->frame_length == 10 * psEncC->fs_kHz ) { > speech_nrg = silk_...
2017 Nov 22
0
Reg an issue with smoothing factor in VAD implementation
...t;> /*********************************/ >> SA_Q15 = silk_sigm_Q15( silk_SMULWB( VAD_SNR_FACTOR_Q16, pSNR_dB_Q7 ) - >> VAD_NEGATIVE_OFFSET_Q5 ); // step1: Calculate speech probability : comment >> by me >> >> /* Power scaling */ >> if( speech_nrg <= 0 ) { // step2: update speech probability based on >> speech energy : comment by me >> SA_Q15 = silk_RSHIFT( SA_Q15, 1 ); >> } else if( speech_nrg < 32768 ) { >> if( psEncC->frame_length == 10 * psEncC->fs_kHz ) { >> speech_nrg = silk_LSHIFT_SAT32( speech_nrg, 16 ); // Energ...
2011 Dec 01
2
How does vmm get all mmio areas of pci devices?
...ocess ,the targe physical address is not stationary but determined by guest os''s driver,then when qemu-dm find no callback for DMA target address, it will pass the content of write operation to vmm by default, vmm then pass the result into the space of guest os). what I want to know is step2 and step5: In step2, how does vmm get all mmio areas of devices? and how vmm set ept entry with these mmio areas ? In setp5, is it ture for DMA operatin I described? and when qemu-dm find no callback function for some MMIO area, what it will do? Thanks for your help. -- View this message in conte...
2010 Mar 15
3
interesting fault.. how? (autocad 2008)
step 1 [Image: http://www.gimptr.com/gimptribay/step1.png ] step2 [Image: http://www.gimptr.com/gimptribay/step2.png ] What can i do?
2017 Nov 27
0
Reg an issue with smoothing factor in VAD implementation
...*****************/ >>> SA_Q15 = silk_sigm_Q15( silk_SMULWB( VAD_SNR_FACTOR_Q16, pSNR_dB_Q7 ) - >>> VAD_NEGATIVE_OFFSET_Q5 ); // step1: Calculate speech probability : comment >>> by me >>> >>> /* Power scaling */ >>> if( speech_nrg <= 0 ) { // step2: update speech probability based on >>> speech energy : comment by me >>> SA_Q15 = silk_RSHIFT( SA_Q15, 1 ); >>> } else if( speech_nrg < 32768 ) { >>> if( psEncC->frame_length == 10 * psEncC->fs_kHz ) { >>> speech_nrg = silk_LSHIFT_SAT32( speech...
2008 May 14
0
Problems with step function
...e have factor variables with 3 levels. The following run shows the first problem. AICs (* and **) are different. I noticed that the Df for rs13482096:rs13483699 is 4, while I think Df should be 6, 2 from rs13483699 and 4 from interactions. When I ran add1 directly, I got Df=6 and AIC 848.75. > step2.bic.out <- step(step.bic.out, scope=list(lower=scope.lower2, upper=scope.upper2), + direction="both", k=log(length(step.bic.out$y)), trace=1) Start: AIC=841.18 pheno.dat ~ rs13479085 + rs13480057 + rs13482096 + rs8254221 Df Deviance AIC...
2010 Sep 30
1
Can this code be written more efficiently?
...cost = mygrid[i,1], gamma = mygrid[i,2], probability=TRUE) }) ### Predict on test set pred.step3 <- numeric(length(svm.models)) for (i in 1:length(svm.models)) { pred.step1 <- predict(svm.models[[i]], myvaliddata, decision.values = F, probability=T) pred.step2 <- prediction(predictions=attr(pred.step1,"probabilities")[,1], labels=myvaliddata$churn) pred.step3[i] <- performance(pred.step2, "auc")@y.values[[1]] } pred.step3 ####End Code#### Thanks, Leo. _______________________________________________________________________...
2004 Sep 02
5
Any way to _always_ execute certain commands in a dialplan context?
I've got a need to do something like the following: [foo-context] exten => _.,1,SetCIDNum(123) exten => _.,2,SetCIDName(XYZ) include => local include => tollfree But of course, this example won't work. The goal here is this: if a call ends up being handled by the "local" or "tollfree" contexts, I want those SetCID*** commands executed. Otherwise, I
2019 Jul 09
2
[LLVM] Infinite loop during LLVM InstructionCombining pass optimization
...r] <badref> = fmul double %129, fsub (double -0.000000e+00, double bitcast (i64 ptrtoint (i8** getelementptr inbounds ({ [2 x i8*] }, { [2 x i8*] }* @_ZTV5PointILi3EE, i64 0, inrange i32 0, i64 2) to i64) to double)) > > > > After Step 3, infinte loop is started (i.e., Step1 -> step2 -> step3 -> step1 ->step2 -> step3 -> ...). > > > > ==================================================================== > > > > > > I will look forward to your response. > > > > > > Thank you very much :). > > > > > >...
2011 Dec 23
1
[LLVMdev] Stop MachineCSE on certain instructions
Hi Jim. I'm doing custom lowering but here I have a very basic issue and the situation is like this - [Original Op] Mul Dest, Src1, Src2 [Expanded from EmitInstrWithCustomInserter] Step1 Dest, Src1, Src2    <=== BuildMI(..., Step1, Dest).addReg(Src1).addReg(Src2) Step2 Dest, Src1, Src2    <=== BuildMI(..., Step2, Dest).addReg(Src1).addReg(Src2) Step3 Dest, Src2, Src1    <=== BuildMI(..., Step3, Dest).addReg(Src2).addReg(Src1) Could manage to skip the CSE on those steps! While mul operation is expanded to multiple (3 in this case) steps, BuildMIs as above....