## ----style, echo = FALSE, results = 'asis'------------------------------------ BiocStyle::markdown() ## ----eval=FALSE--------------------------------------------------------------- # if(!requireNamespace("BiocManager", quietly=TRUE)) # install.packages("BiocManager") # BiocManager::install("scoup") ## ----eval=TRUE---------------------------------------------------------------- # Make package accessible in R session library(scoup) # Number of extant taxa ## Excluded values contributed to results presented in article leaves <- 8 # 64 # Number of codon sites ## Excluded values contributed to results presented in article sSize <- 15 # 250 # Number of data replications for each parameter combination ## Edited count was used for the results presented in article sims <- 1 # 50 # OU reversion parameter (Theta) value ## Excluded values contributed to results presented in article eThta <- c(0.01) # c(0.01, 0.1, 1) # OU asymptotic variance value ## Excluded values contributed to results presented in article eVary <- c(0.0001) # c(0.0001, 0.01, 1) # OU landscape shift parameters hbrunoStat <- hbInput(c(vNvS=1, nsynVar=0.01)) # Sequence alignment size information seqStat <- seqDetails(c(nsite=sSize, ntaxa=leaves)) # Iterate over all listed OU variance values for(g in seq(1,length(eVary))){ # Iterate over all listed OU reversion parameter values for(h in seq(1,length(eThta))){ # Create appropriate simulation function ("ou") object adaptStat <- ouInput(c(eVar=eVary[g],Theta=eThta[h])) # Iterate over the specified number of replicates for(i in seq(1,sims)){ # Execute simulation simData <- alignsim(adaptStat, seqStat, hbrunoStat, NULL) } } } # Print simulated alignment seqCOL(simData) ## ----eval=TRUE---------------------------------------------------------------- # Make package accessible in R session library(scoup) # Number of extant taxa ## Omitted value was used for the results presented in article xtant <- 8 # 64 # Number of codon sites ## Omitted count was used for the results presented in article siteSize <- 15 # 64 # Number of data replications for each parameter combination ## Omitted count was used for the results presented in article simSize <- 1 # 50 # Variance of the non-synonymous selection coefficients ## Excluded values contributed to results presented in article nsynVary <- c(0) # c(0, 0.001, 0.1) # Ratio of the variance of the non-synonymous to synonymous coeff. ## Excluded values contributed to results presented in article vNvSvec <- c(0) # c(0, 0.001, 1, 10) # Sequence alignment size information seqStat <- seqDetails(c(nsite=siteSize, ntaxa=xtant)) # Iterate over all listed coefficient variance ratios for(a in seq(1,length(vNvSvec))){ # Iterate over all listed non-synonymous coefficients variance for(b in seq(1,length(nsynVary))){ # Create appropriate simulation function ("omega") object adaptData <- wInput(list(vNvS=vNvSvec[a],nsynVar=nsynVary[b])) # Iterate over the specified number of replicates for(i in seq(1,simSize)){ # Execute simulation simulateSeq <- alignsim(adaptData, seqStat, NA) } } } # Print simulated alignment cseq(simulateSeq) ## ----eval=TRUE---------------------------------------------------------------- # Make package accessible in R session library(scoup) # Number of codon sites ## Commented value was used for results presented in article sitesize<- 15 # 100 # Variance of non-synonymous selection coefficients nsynVary <- 0.01 # Number of extant taxa ## Commented value was used for results presented in article taxasize <- 8 # 1024 # Sequence alignment size information seqsEntry <- seqDetails(c(nsite=sitesize, ntaxa=taxasize)) # Create the applicable ("ou") object for simulation function ## eVar= OU asymptotic variance, Theta=OU reversion parameter adaptEntry <- ouInput(c(eVar=0.1,Theta=1)) # Ratio of the variance of the non-synonymous to synonymous coeff. ## Excluded values contributed to results presented in article sratio <- c(0) # c(0, 1e-06, 1e-03, 0.1, 1, 10, 1000) # Iterate over all listed coefficient variance ratios for(a0 in seq(1,length(sratio))){ # OU landscape shift parameters mValues <- hbInput(c(vNvS=sratio[a0], nsynVar=nsynVary)) # Execute simulation simSeq <- alignsim(adaptEntry, seqsEntry, mValues, NA) } # Print simulated codon sequence cseq(simSeq) ## ----eval=TRUE---------------------------------------------------------------- # Make package accessible in R session library(scoup) # Number of internal nodes on the desired balanced tree iNode <- 3 # Number of required codon sites ## Excluded value was used for the results presented in article siteCount <- 15 # 1000 # Variance of non-synonymous selection coefficients nsnV <- 0.01 # Number of data replications for each parameter combination ## Edited count was used for the results presented in article nsim <- 1 # 50 # Ratio of the variance of the non-synonymous to synonymous coeff. ## Excluded values contributed to results presented in article vNvSvec <- c(0) # c(0, 1e-06, 1e-03, 0.1, 1, 10, 100) # Sequence alignment size information seqsBwise <- seqDetails(c(nsite=siteCount, blength=0.10)) # Iterate over all listed coefficient variance ratios for(h in seq(1,length(vNvSvec))){ # Iterate over the specified number of replicates for(i in seq(1,nsim)){ # Create the parameter set applicable at each internal tree node scInput <- rbind(vNvS=c(rep(0,iNode-1),vNvSvec[h]), nsynVar=rep(nsnV,iNode)) # Create the applicable ("discrete") object for simulation function adaptBranch <- discreteInput(list(p02xnodes=scInput)) # Execute simulation genSeq <- alignsim(adaptBranch, seqsBwise, NULL) } } # Print simulated sequence data seqCOL(genSeq) ## ----sessionInfo, echo=FALSE-------------------------------------------------- sessionInfo()