diff --git a/R/addChaikin.R b/R/addChaikin.R index 4e836101..1ef01b98 100644 --- a/R/addChaikin.R +++ b/R/addChaikin.R @@ -9,87 +9,135 @@ `addChAD` <- function (..., on = NA, legend = "auto") { - lchob <- get.current.chob() - x <- as.matrix(lchob@xdata) - x <- chaikinAD(HLC = HLC(x), volume = Vo(x)) - yrange <- NULL - chobTA <- new("chobTA") - if (NCOL(x) == 1) { - chobTA@TA.values <- x[lchob@xsubset] - } - else chobTA@TA.values <- x[lchob@xsubset, ] - chobTA@name <- "chartTA" - if (any(is.na(on))) { - chobTA@new <- TRUE + lenv <- new.env() + lenv$chartChAD <- function(x, ..., on, legend) { + xdata <- x$Env$xdata + xsubset <- x$Env$xsubset + vo <- x$Env$vo + ChaikinAD <- chaikinAD(HLC = HLC(xdata), volume = vo)[xsubset] + spacing <- x$Env$theme$spacing + x.pos <- 1 + spacing * (1:NROW(ChaikinAD) - 1) + xlim <- x$Env$xlim + ylim <- range(ChaikinAD,na.rm=TRUE) + theme <- x$Env$theme + + lines(x.pos, ChaikinAD, col = theme$chaikin$col$chaikinad, + lwd = 1, lend = 2, ...) } - else { - chobTA@new <- FALSE - chobTA@on <- on + if(!is.character(legend) || legend == "auto") + legend <- gsub("^addChAD", "Chaikin Acc/Dist", deparse(match.call())) + mapply(function(name, value) { + assign(name, value, envir = lenv) + }, names(list(..., on = on, legend = legend)), + list(..., on = on, legend = legend)) + exp <- parse(text = gsub("list", "chartChAD", as.expression(substitute(list(x = current.chob(), + ..., on = on, legend = legend)))), srcfile = NULL) + exp <- c(exp, expression( + lc <- xts:::legend.coords("topleft", xlim, range(ChaikinAD,na.rm=TRUE)), + legend(x = lc$x, y = lc$y, + legend = c(paste(legend, ":"), + paste(format(last(ChaikinAD),nsmall = 3L))), + text.col = c(theme$fg, theme$chaikin$col$chaikinad), + xjust = lc$xjust, + yjust = lc$yjust, + bty = "n", + y.intersp=0.95))) + exp <- c(expression( + # add inbox color + rect(xlim[1], range(ChaikinAD, na.rm=TRUE)[1], xlim[2], range(ChaikinAD, na.rm=TRUE)[2], col=theme$fill), + # add grid lines and left-side axis labels + segments(xlim[1], y_grid_lines(range(ChaikinAD, na.rm=TRUE)), + xlim[2], y_grid_lines(range(ChaikinAD, na.rm=TRUE)), + col = theme$grid, lwd = x$Env$grid.ticks.lwd, lty = 3), + text(xlim[1], y_grid_lines(range(ChaikinAD, na.rm=TRUE)), y_grid_lines(range(ChaikinAD, na.rm=TRUE)), + col = theme$labels, srt = theme$srt, + offset = 0.5, pos = 2, cex = theme$cex.axis, xpd = TRUE), + # add border of plotting area + rect(xlim[1], range(ChaikinAD, na.rm=TRUE)[1], xlim[2], range(ChaikinAD, na.rm=TRUE)[2], border=theme$labels)), exp) + + lchob <- current.chob() + if (is.null(lchob$Env$theme$chaikin$col$chaikinad)) { + lchob$Env$theme$chaikin$col$chaikinad <- 3 } - chobTA@call <- match.call() - legend.name <- gsub("^.*[(]", " Chaikin Acc/Dist (", deparse(match.call())) - #extended = TRUE) - gpars <- c(list(...), list(col = 11))[unique(names(c(list(col = 11), - list(...))))] - chobTA@params <- list(xrange = lchob@xrange, yrange = yrange, - colors = lchob@colors, color.vol = lchob@color.vol, multi.col = lchob@multi.col, - spacing = lchob@spacing, width = lchob@width, bp = lchob@bp, - x.labels = lchob@x.labels, time.scale = lchob@time.scale, - isLogical = is.logical(x), legend = legend, legend.name = legend.name, - pars = list(gpars)) - if (is.null(sys.call(-1))) { - TA <- lchob@passed.args$TA - lchob@passed.args$TA <- c(TA, chobTA) - lchob@windows <- lchob@windows + ifelse(chobTA@new, 1, - 0) - do.call("chartSeries.chob", list(lchob)) - invisible(chobTA) + xdata <- lchob$Env$xdata + xsubset <- lchob$Env$xsubset + vo <- lchob$Env$vo + ChaikinAD <- chaikinAD(HLC = HLC(xdata), volume = vo)[xsubset] + lchob$Env$ChaikinAD <- ChaikinAD + if(is.na(on)) { + lchob$add_frame(ylim=range(ChaikinAD,na.rm=TRUE),asp=1,fixed=TRUE) + lchob$next_frame() } else { - return(chobTA) + lchob$set_frame(sign(on)*(abs(on)+1L)) } + lchob$replot(exp, env=c(lenv,lchob$Env), expr=TRUE) + lchob } `addChVol` <- function (n = 10, maType, ..., on = NA, legend = "auto") { - lchob <- get.current.chob() - x <- as.matrix(lchob@xdata) - x <- chaikinVolatility(HL = HLC(x)[,-3], n = n, maType = maType) - yrange <- NULL - chobTA <- new("chobTA") - if (NCOL(x) == 1) { - chobTA@TA.values <- x[lchob@xsubset] + lenv <- new.env() + lenv$chartChVol <- function(x, n, maType, ..., on, legend) { + xdata <- x$Env$xdata + xsubset <- x$Env$xsubset + ChaikinVol <- chaikinVolatility(HL = HLC(xdata)[,-3], n = n, maType = maType)[xsubset] + spacing <- x$Env$theme$spacing + x.pos <- 1 + spacing * (1:NROW(ChaikinVol) - 1) + xlim <- x$Env$xlim + ylim <- range(ChaikinVol,na.rm=TRUE) + theme <- x$Env$theme + + lines(x.pos, ChaikinVol, col = theme$chaikin$col$chaikinvol, + lwd = 1, lend = 2, ...) } - else chobTA@TA.values <- x[lchob@xsubset, ] - chobTA@name <- "chartTA" - if (any(is.na(on))) { - chobTA@new <- TRUE - } - else { - chobTA@new <- FALSE - chobTA@on <- on + if(missing(maType)) maType <- "SMA" + if(!is.character(legend) || legend == "auto") + legend <- gsub("^addChVol", "Chaikin Volatility", deparse(match.call())) + mapply(function(name, value) { + assign(name, value, envir = lenv) + }, names(list(n = n, maType = maType, ..., on = on, legend = legend)), + list(n = n, maType = maType, ..., on = on, legend = legend)) + exp <- parse(text = gsub("list", "chartChVol", as.expression(substitute(list(x = current.chob(), + n = n, maType = maType, ..., on = on, legend = legend)))), srcfile = NULL) + exp <- c(exp, expression( + lc <- xts:::legend.coords("topleft", xlim, range(ChaikinVol,na.rm=TRUE)), + legend(x = lc$x, y = lc$y, + legend = c(paste(legend, ":"), + paste(format(last(ChaikinVol),nsmall = 3L))), + text.col = c(theme$fg, theme$chaikin$col$chaikinvol), + xjust = lc$xjust, + yjust = lc$yjust, + bty = "n", + y.intersp=0.95))) + exp <- c(expression( + # add inbox color + rect(xlim[1], range(ChaikinVol, na.rm=TRUE)[1], xlim[2], range(ChaikinVol, na.rm=TRUE)[2], col=theme$fill), + # add grid lines and left-side axis labels + segments(xlim[1], y_grid_lines(range(ChaikinVol, na.rm=TRUE)), + xlim[2], y_grid_lines(range(ChaikinVol, na.rm=TRUE)), + col = theme$grid, lwd = x$Env$grid.ticks.lwd, lty = 3), + text(xlim[1], y_grid_lines(range(ChaikinVol, na.rm=TRUE)), y_grid_lines(range(ChaikinVol, na.rm=TRUE)), + col = theme$labels, srt = theme$srt, + offset = 0.5, pos = 2, cex = theme$cex.axis, xpd = TRUE), + # add border of plotting area + rect(xlim[1], range(ChaikinVol, na.rm=TRUE)[1], xlim[2], range(ChaikinVol, na.rm=TRUE)[2], border=theme$labels)), exp) + lchob <- current.chob() + if (is.null(lchob$Env$theme$chaikin$col$chaikinvol)) { + lchob$Env$theme$chaikin$col$chaikinvol <- "#F5F5F5" } - chobTA@call <- match.call() - legend.name <- gsub("^.*[(]", " Chaikin Volatility (", deparse(match.call()))#, - #extended = TRUE) - gpars <- c(list(...), list(col = 8))[unique(names(c(list(col = 8), - list(...))))] - chobTA@params <- list(xrange = lchob@xrange, yrange = yrange, - colors = lchob@colors, color.vol = lchob@color.vol, multi.col = lchob@multi.col, - spacing = lchob@spacing, width = lchob@width, bp = lchob@bp, - x.labels = lchob@x.labels, time.scale = lchob@time.scale, - isLogical = is.logical(x), legend = legend, legend.name = legend.name, - pars = list(gpars)) - if (is.null(sys.call(-1))) { - TA <- lchob@passed.args$TA - lchob@passed.args$TA <- c(TA, chobTA) - lchob@windows <- lchob@windows + ifelse(chobTA@new, 1, - 0) - do.call("chartSeries.chob", list(lchob)) - invisible(chobTA) + xdata <- lchob$Env$xdata + xsubset <- lchob$Env$xsubset + ChaikinVol <- chaikinVolatility(HL = HLC(xdata)[,-3], n = n, maType = maType)[xsubset] + lchob$Env$ChaikinVol <- ChaikinVol + if(is.na(on)) { + lchob$add_frame(ylim=range(ChaikinVol,na.rm=TRUE),asp=1,fixed=TRUE) + lchob$next_frame() } else { - return(chobTA) + lchob$set_frame(sign(on)*(abs(on)+1L)) } + lchob$replot(exp, env=c(lenv,lchob$Env), expr=TRUE) + lchob }