Home
last modified time | relevance | path

Searched refs:nSig (Results 1 – 25 of 41) sorted by relevance

12

/dports/finance/R-cran-TTR/TTR/R/
H A DMACD.R86 function(x, nFast=12, nSlow=26, nSig=9, maType, percent=TRUE, ...) { argument
119 maType[[3]]$n <- nSig
144 signal <- do.call( maType, c( list( macd ), list(n=nSig, ...) ) )
H A DKST.R73 function(price, n=c(10,10,10,15), nROC=c(10,15,20,30), nSig=9, argument
153 signal <- do.call( maType, c( list(kst), list(n=nSig, ...) ) )
H A DTRIX.R67 function(price, n=20, nSig=9, maType, percent=TRUE, ...) { argument
98 maType[[4]]$n <- nSig
H A Dstochastics.R223 function(HLC, n=13, nFast=2, nSlow=25, nSig=9, maType, bounded=TRUE, ...) { argument
285 maType[[3]]$n <- nSig
308 signal <- do.call( maType, c( list(SMI), list(n=nSig, ... ) ) )
/dports/finance/R-cran-quantmod/quantmod/R/
H A DaddKST.R9 function (n = c(10, 10, 10, 15), nROC = c(10, 15, 20, 30), nSig = 9, argument
15 x <- KST(price = x, n = n, nROC = nROC, nSig = nSig, maType = maType,
H A Dchart_Series.R738 add_SMI <- function (n=13, nFast=25, nSlow=2, nSig=9, maType="EMA", bounded=TRUE,...) { argument
740 lenv$plot_smi <- function(x, n, nFast, nSlow, nSig, maType, bounded, ...) { argument
743 smi <- SMI(HLC(xdata),n=n,nFast=nFast,nSlow=nSlow,nSig=nSig,
754 names(list(n=n,nFast=nFast,nSlow=nSlow,nSig=nSig,maType=maType,bounded=bounded,...)), nameattr
755 list(n=n,nFast=nFast,nSlow=nSlow,nSig=nSig,maType=maType,bounded=bounded,...)) nameattr
759 nSlow=nSlow,nSig=nSig, nameattr
769 smi <- SMI(HLC(plot_object$Env$xdata),n=n,nFast=nFast,nSlow=nSlow,nSig=nSig,
775 … 1+strwidth(paste("SMI(",paste(n,nFast,nSlow,nSig,sep=","),"):",sep="")),
776 … 1+strwidth(paste("SMI(",paste(n,nFast,nSlow,nSig,sep=","),"):",sep=""))+strwidth("-22.22222")),
778 c(paste("SMI(",paste(n,nFast,nSlow,nSig,sep=","),"):",sep=""),
H A DaddSMI.R22 nSlow=slow, nSig=signal, maType=ma.type)
/dports/editors/libreoffice/libreoffice-7.2.6.2/oox/source/ole/
H A Dvbainputstream.cxx43 sal_uInt8 nSig = rInStrm.readuInt8(); in VbaInputStream() local
44 OSL_ENSURE( nSig == VBASTREAM_SIGNATURE, "VbaInputStream::VbaInputStream - wrong signature" ); in VbaInputStream()
45 mbEof = mbEof || rInStrm.isEof() || (nSig != VBASTREAM_SIGNATURE); in VbaInputStream()
/dports/editors/libreoffice6/libreoffice-6.4.7.2/oox/source/ole/
H A Dvbainputstream.cxx44 sal_uInt8 nSig = rInStrm.readuInt8(); in VbaInputStream() local
45 OSL_ENSURE( nSig == VBASTREAM_SIGNATURE, "VbaInputStream::VbaInputStream - wrong signature" ); in VbaInputStream()
46 mbEof = mbEof || rInStrm.isEof() || (nSig != VBASTREAM_SIGNATURE); in VbaInputStream()
/dports/databases/sqlite3/sqlite-src-3350500/ext/misc/
H A Ddecimal.c346 int nSig, nFrac, nDigit; in decimal_add() local
359 nSig = pA->nDigit - pA->nFrac; in decimal_add()
360 if( nSig && pA->a[0]==0 ) nSig--; in decimal_add()
361 if( nSig<pB->nDigit-pB->nFrac ){ in decimal_add()
362 nSig = pB->nDigit - pB->nFrac; in decimal_add()
366 nDigit = nSig + nFrac + 1; in decimal_add()
/dports/www/chromium-legacy/chromium-88.0.4324.182/third_party/sqlite/src/ext/misc/
H A Ddecimal.c346 int nSig, nFrac, nDigit; in decimal_add() local
359 nSig = pA->nDigit - pA->nFrac; in decimal_add()
360 if( nSig && pA->a[0]==0 ) nSig--; in decimal_add()
361 if( nSig<pB->nDigit-pB->nFrac ){ in decimal_add()
362 nSig = pB->nDigit - pB->nFrac; in decimal_add()
366 nDigit = nSig + nFrac + 1; in decimal_add()
/dports/graphics/tgif/tgif-QPL-4.2.5/
H A Dtcp.c65 void BrokenPipe(nSig) in BrokenPipe() argument
66 int nSig; in BrokenPipe()
68 if (nSig == SIGPIPE) {
/dports/science/iboview/ibo-view.20150427/src/Common/
H A DCxAlgebra.cpp209 nSig = std::min(nRows, nCols); in ComputeSvd() local
210 assert(ldU >= nRows && ldVt >= nSig && ldIn >= nRows); in ComputeSvd()
215 *piWork = (FORTINT*)::malloc(sizeof(FORTINT)*8*nSig); in ComputeSvd()
/dports/finance/R-cran-TTR/TTR/man/
H A DTRIX.Rd7 TRIX(price, n = 20, nSig = 9, maType, percent = TRUE, ...)
14 \item{nSig}{Number of periods for signal line moving average.}
H A DKST.Rd11 nSig = 9,
24 \item{nSig}{The number of periods to use for the KST signal line.}
H A DMACD.Rd7 MACD(x, nFast = 12, nSlow = 26, nSig = 9, maType, percent = TRUE, ...)
17 \item{nSig}{Number of periods for signal moving average.}
H A Dstochastics.Rd23 SMI(HLC, n = 13, nFast = 2, nSlow = 25, nSig = 9, maType, bounded = TRUE, ...)
62 \item{nSig}{Number of periods for signal line.}
/dports/misc/vxl/vxl-3.3.2/core/vgui/impl/win32/
H A Dvgui_win32_cmdtarget.cxx18 while (lpEntry->nSig != AfxSig_end) in OnCmdMsg()
H A Dvgui_win32_cmdtarget.h80 UINT nSig; // signature type (action) or pointer to message # member
/dports/science/iboview/ibo-view.20150427/src/MicroScf/
H A DCtMatrix.cpp297 nSig = std::min(nRows, nCols); in ComputeSvd() local
298 assert(U.nRows >= nRows && U.nCols >= nSig); in ComputeSvd()
299 assert(Vt.nRows >= nSig && Vt.nCols >= nCols); in ComputeSvd()
301 U.nCols = nSig; in ComputeSvd()
302 Vt.nRows = nSig; in ComputeSvd()
319 nSig = std::min(nRows, nCols); in AllocAndComputeSvd() local
320 U = MakeStackMatrix(nRows, nSig, Mem); in AllocAndComputeSvd()
321 Vt = MakeStackMatrix(nSig, nCols, Mem); in AllocAndComputeSvd()
322 Mem.Alloc(pSigma, nSig); in AllocAndComputeSvd()
/dports/graphics/sampleicc/SampleICC-1.6.8/IccProfLib/
H A DIccUtil.cpp741 const icChar *icGetSig(icChar *pBuf, icUInt32Number nSig, bool bGetHexVal) in icGetSig() argument
744 icUInt32Number sig=nSig; in icGetSig()
747 if (!nSig) { in icGetSig()
762 sprintf(pBuf+5, "' = %08X", nSig); in icGetSig()
769 const icChar *icGetSigStr(icChar *pBuf, icUInt32Number nSig) in icGetSigStr() argument
772 icUInt32Number sig=nSig; in icGetSigStr()
793 sprintf(pBuf, "%08Xh", nSig); in icGetSigStr()
/dports/math/R/R-4.1.2/src/gnuwin32/fixed/h/
H A Dpsignal.h93 typedef void (*sighandler_t)(int nSig);
/dports/math/libRmath/R-4.1.1/src/gnuwin32/fixed/h/
H A Dpsignal.h93 typedef void (*sighandler_t)(int nSig);
/dports/math/R/R-4.1.2/src/gnuwin32/front-ends/
H A Drterm.c55 static void my_onintr(int nSig) in my_onintr() argument
/dports/math/libRmath/R-4.1.1/src/gnuwin32/front-ends/
H A Drterm.c55 static void my_onintr(int nSig) in my_onintr() argument

12