[Blotter-commits] r1304 - pkg/quantstrat/R
    noreply at r-forge.r-project.org 
    noreply at r-forge.r-project.org
       
    Wed Dec 19 02:16:45 CET 2012
    
    
  
Author: opentrades
Date: 2012-12-19 02:16:44 +0100 (Wed, 19 Dec 2012)
New Revision: 1304
Modified:
   pkg/quantstrat/R/walk.forward.R
Log:
- some improvements to documentation
- window now moves forward by k.training instead of 1
Modified: pkg/quantstrat/R/walk.forward.R
===================================================================
--- pkg/quantstrat/R/walk.forward.R	2012-12-18 23:52:12 UTC (rev 1303)
+++ pkg/quantstrat/R/walk.forward.R	2012-12-19 01:16:44 UTC (rev 1304)
@@ -17,98 +17,110 @@
 
 max.Net.Trading.PL <- function(tradeStats.list)
 {
-        which(max(tradeStats.list$Net.Trading.PL) == tradeStats.list$Net.Trading.PL)
+	which(max(tradeStats.list$Net.Trading.PL) == tradeStats.list$Net.Trading.PL)
 }
 
 ### exported functions ############################################################
 
-#' walk.forward
+#' Rolling walk forward analysis
 #' 
-#' walk.forward
+#' A wrapper for apply.paramset() and applyStrategy(), implementing a Rolling Walk Forward Analysis (WFA). It executes a strategy on a portfolio, while
+#' rolling a re-optimization of one of the strategies parameter sets during a specified time period (training window), then selecting an optimal
+#' parameter combination from the parameter set using an objective function, then applying the selected parameter combo to the next out-of-sample
+#' time period immediately following the training window (testing window). Once completed,
+#' the training window is shifted forward by a time period equal to the testing window size, and the process is repeated. 
+#' WFA stops when there are insufficient data left for a full testing window. For a complete description, see Jaekle&Tomasini chapter 6.
 #' 
-#' @param strategy the name of the strategy object
-#' @param paramset.label a label uniquely identifying the paramset within the strategy
+#' @param portfolio.st the name of the portfolio object
+#' @param strategy.st the name of the strategy object
+#' @param paramset.label a label uniquely identifying within the strategy the paramset to be tested
+#' @param period the period unit, as a character string, eg. 'days' or 'months'
+#' @param k.training the number of periods to use for training, eg. '3' months
+#' @param nsamples the number of sample param.combos to draw from the paramset for training; 0 means all samples (see also apply.paramset)
+#' @param k.testing the number of periods to use for testing, eg. '1 month'
+#' @param objective a user provided function returning the best param.combo from the paramset, based on training results; a default function is provided that returns the number of the param.combo that brings the highest Net.Trading.PL
+#' @param verbose dumps a lot of info during the run if set to TRUE, defaults to FALSE
 #'
 #' @author Jan Humme
 #' @export
 
-walk.forward <- function(portfolio.st, strategy.st, paramset.label, on, k.training, nsamples=0, k.testing, objective=max.Net.Trading.PL, verbose=FALSE)
+walk.forward <- function(portfolio.st, strategy.st, paramset.label, period, k.training, nsamples=0, k.testing, objective=max.Net.Trading.PL, verbose=FALSE)
 {
-warning('walk.forward() is still under development! expect changes in arguments and results at any time JH')
+	warning('walk.forward() is still under development! expect changes in arguments and results at any time JH')
 
-        must.have.args(match.call(), c('portfolio.st', 'strategy.st', 'paramset.label', 'k.training'))
+	must.have.args(match.call(), c('portfolio.st', 'strategy.st', 'paramset.label', 'k.training'))
 
-        strategy <- must.be.strategy(strategy.st)
-        must.be.paramset(strategy, paramset.label)
+	strategy <- must.be.strategy(strategy.st)
+	must.be.paramset(strategy, paramset.label)
 
-        portfolio <- getPortfolio(portfolio.st)
+	portfolio <- getPortfolio(portfolio.st)
 
-        results <- list()
+	results <- list()
 
-        for(symbol.st in names(portfolio$symbols))
-        {
-                symbol <- get(symbol.st)
+	for(symbol.st in names(portfolio$symbols))
+	{
+		symbol <- get(symbol.st)
 
-                ep <- endpoints(symbol, on)
+		ep <- endpoints(symbol, on=period)
 
-                k <- 1; while(TRUE)
-                {
-                        result <- list()
+		k <- 1; while(TRUE)
+		{
+			result <- list()
 
-                        training.start <- ep[k] + 1
-                        training.end  <- ep[k + k.training]
+			training.start <- ep[k] + 1
+			training.end  <- ep[k + k.training]
 
-                        if(is.na(training.end))
-                                break
+			if(is.na(training.end))
+				break
 
-                        result$training <- list()
-                        result$training$start <- index(symbol[training.start])
-                        result$training$end <- index(symbol[training.end])
+			result$training <- list()
+			result$training$start <- index(symbol[training.start])
+			result$training$end <- index(symbol[training.end])
 
-                        print(paste('=== training', paramset.label, 'on', paste(result$training$start, result$training$end, sep='/')))
+			print(paste('=== training', paramset.label, 'on', paste(result$training$start, result$training$end, sep='/')))
 
-                        result$training$results <- apply.paramset(strategy.st=strategy.st, paramset.label=paramset.label, portfolio.st=portfolio.st, mktdata=symbol[training.start:training.end], nsamples=nsamples, verbose=verbose)
+			result$training$results <- apply.paramset(strategy.st=strategy.st, paramset.label=paramset.label, portfolio.st=portfolio.st, mktdata=symbol[training.start:training.end], nsamples=nsamples, verbose=verbose)
 
-                        if(!missing(k.testing) && k.testing>0)
-                        {
-                                if(!is.function(objective))
-                                        stop(paste(objective, 'unknown objective function', sep=': '))
+			if(!missing(k.testing) && k.testing>0)
+			{
+				if(!is.function(objective))
+					stop(paste(objective, 'unknown objective function', sep=': '))
 
-                                testing.start <- ep[k + k.training] + 1
-                                testing.end   <- ep[k + k.training + k.testing]
+				testing.start <- ep[k + k.training] + 1
+				testing.end   <- ep[k + k.training + k.testing]
 
-                                if(is.na(testing.end))
-                                        break
+				if(is.na(testing.end))
+					break
 
-                                result$testing <- list()
-                                result$testing$start <- index(symbol[testing.start])
-                                result$testing$end <- index(symbol[testing.end])
+				result$testing <- list()
+				result$testing$start <- index(symbol[testing.start])
+				result$testing$end <- index(symbol[testing.end])
 
-                                tradeStats.list <- result$training$results$tradeStats
-                                param.combo.nr <- do.call(objective, list('tradeStats.list'=tradeStats.list))
-                                result$testing$param.combo.nr <- param.combo.nr
+				tradeStats.list <- result$training$results$tradeStats
+				param.combo.nr <- do.call(objective, list('tradeStats.list'=tradeStats.list))
+				result$testing$param.combo.nr <- param.combo.nr
 
-                                last.param.combo.column.nr <- grep('Portfolio', names(tradeStats.list)) - 1
-                                param.combo <- tradeStats.list[param.combo.nr,1:last.param.combo.column.nr]
-                                result$testing$param.combo <- param.combo
+				last.param.combo.column.nr <- grep('Portfolio', names(tradeStats.list)) - 1
+				param.combo <- tradeStats.list[param.combo.nr,1:last.param.combo.column.nr]
+				result$testing$param.combo <- param.combo
 
-                                strategy <- quantstrat:::install.param.combo(strategy, param.combo, paramset.label)
-                                result$testing$strategy <- param.combo
+				strategy <- quantstrat:::install.param.combo(strategy, param.combo, paramset.label)
+				result$testing$strategy <- param.combo
 
-                                print(paste('--- testing param.combo', param.combo.nr, 'on', paste(result$testing$start, result$testing$end, sep='/')))
+				print(paste('--- testing param.combo', param.combo.nr, 'on', paste(result$testing$start, result$testing$end, sep='/')))
 
 #browser()
-                                applyStrategy(strategy, portfolios=portfolio.st, mktdata=symbol[testing.start:testing.end])
-                        }
-                        results[[k]] <- result
+				applyStrategy(strategy, portfolios=portfolio.st, mktdata=symbol[testing.start:testing.end])
+			}
+			results[[k]] <- result
 
-                        k <- k + 1
-                }
-        }
-        updatePortf(portfolio.st, Dates=paste('::',as.Date(Sys.time()),sep=''))
+			k <- k + k.training
+		}
+	}
+	updatePortf(portfolio.st, Dates=paste('::',as.Date(Sys.time()),sep=''))
 
-        results$portfolio <- portfolio
-        results$tradeStats <- tradeStats(portfolio.st)
+	results$portfolio <- portfolio
+	results$tradeStats <- tradeStats(portfolio.st)
 
-        return(results)
+	return(results)
 } 
    
    
More information about the Blotter-commits
mailing list