Header menu logo Teaching

BinderScriptNotebook

Volatility timing

We're going to look at how to manage portfolio volatility. Managing volatility is a fundamental risk-management task. You probably have some notion of the amount of volatility that you want in your portfolio, or that you feel comfortable bearing. Maybe you're ok with an annualized volatility of 15%, but 30% is too much and makes it hard for you to sleep at night. If that's the case, then when markets get volatile you might want to take action to reduce your portfolio's volatility. We'll discuss some strategies for predicting and managing volatility below.

We will focus on allocating between a risky asset and a risk-free asset as a way to manage volatility (i.e., two-fund separation). We're taking the risky asset, such as the market portfolio of equities, as given. The essential idea is to put more weight on the risky asset when expected volatility is low and less weight on the risky asset when expected volatility is high. This is related to a portfolio construction strategy known as risk-parity. The managed volatility strategy that we consider below is based off work by Barroso and Santa-Clara (2015), Daniel and Moskowitz (2016), and Moreira and Muir (2017). The Moreira and Muir (2017) paper is probably the best place to start. Though the observation that a) predictable volatility and b) unpredictable returns implies predictable Sharpe ratios predates the above work.

Acquiring Fama-French data

As a start, let's acquire a long daily time series on aggregate US market returns. We'll use the 3 factors dataset.

#r "nuget: FSharp.Data, 5.0.2"
#r "nuget: NovaSBE.Finance, 0.5.0"
open System
open FSharp.Data
open NovaSBE.Finance.French

let ff3 = 
    getFF3 Frequency.Daily 
    |> Array.toList
        
        

Observing time-varying volatility

One thing that can help us manage volatility is the fact that volatility tends to be somewhat persistent. By this we mean that if our risky asset is volatile today, then it is likely to be volatile tomorrow. We can observe this by plotting monthly volatility as we do below. It also means that we can use recent past volatility to form estimates of future volatility.

#r "nuget: FSharp.Stats, 0.5.0"
#r "nuget: Plotly.NET, 3.*"
#r "nuget: Plotly.NET.Interactive, 3.*"

open FSharp.Stats
open Plotly.NET

If returns are indepedent and identially distributed, then volatitlity (standard deviation) will grow at the square root of t. So annual volatility is \(\sqrt{252}\sigma_{daily}\).

\[ \sigma^2_{[1,T]} = var(T\tilde{r})=Tvar(\tilde{r})=T\sigma^2 \rightarrow\]

\[ \sigma_{[1,T]} = \sqrt{T}\sigma \]

let annualizeDaily x = x * sqrt(252.0) * 100. 

First, group days by month.

let daysByMonth = ff3 |> List.groupBy (fun x -> x.Date.Year, x.Date.Month)
daysByMonth[0..2]

Look at a test month

let testMonth = daysByMonth[0]
testMonth

Split month from observations that month

let testMonthGroup, testMonthObs = testMonth

testMonthGroup

testMonthGroup
(1926, 7)

testMonthXS

testMonthObs |> List.take 3
[{ Date = 7/1/1926 12:00:00 AM
   MktRf = 0.001
   Smb = -0.0025
   Hml = -0.0027
   Rf = 9e-05
   Frequency = Daily }; { Date = 7/2/1926 12:00:00 AM
                          MktRf = 0.0045
                          Smb = -0.0033
                          Hml = -0.0006
                          Rf = 9e-05
                          Frequency = Daily }; { Date = 7/6/1926 12:00:00 AM
                                                 MktRf = 0.0017
                                                 Smb = 0.003
                                                 Hml = -0.0039
                                                 Rf = 9e-05
                                                 Frequency = Daily }]

Test month return standard deviation.

testMonthObs
|> List.map(fun x -> x.MktRf)
|> stDev
|> annualizeDaily

Then, compute the standard deviation of returns for each month.

[ for ((year, month), xs) in daysByMonth do 
    let lastDayOb = xs |> List.sortBy (fun x -> x.Date) |> List.last 
    let lastDate = lastDayOb.Date
    let annualizedVolPct = 
        xs 
        |> List.map(fun x -> x.MktRf)
        |> stDev
        |> annualizeDaily
    lastDate, annualizedVolPct]

Or, all in one go

let monthlyVol =
    ff3
    |> List.groupBy(fun x -> x.Date.Year, x.Date.Month)
    |> List.map(fun (_ym, xs) -> 
        let lastOb = xs |> List.sortBy (fun x -> x.Date) |> List.last 
        let annualizedVolPct = xs |> stDevBy(fun x -> x.MktRf) |> annualizeDaily
        lastOb.Date, annualizedVolPct)

A function to plot volatilities.

let volChart (vols: list<DateTime * float>) =
    let years = vols |> List.map(fun (dt:DateTime,_vol) -> dt.Year ) 
    let minYear = years |> List.min
    let maxYear = years |> List.max
    vols
    |> Chart.Column
    |> Chart.withMarkerStyle  (Outline = Line.init(Color = Color.fromKeyword ColorKeyword.Blue))  
    |> Chart.withXAxisStyle(TitleText = $"Time-varying Volatility ({minYear}-{maxYear})")
    |> Chart.withYAxisStyle(TitleText = "Annualized Volatility (%)")

the full time series

let allVolsChart = volChart monthlyVol
allVolsChart

since 2019

let since2019VolChart = 
    monthlyVol 
    |> List.filter(fun (dt,_) -> dt >= DateTime(2019,1,1))
    |> volChart
since2019VolChart

Effect of leverage on volatility

Recall the formula for variance of a portfolio consisting of stocks \(x\) and \(y\):

\[ \sigma^2 = w_x^2 \sigma^2_x + w_y^2 \sigma^2_y + 2 w_x w_y cov(r_x,r_y), \]

where \(w_x\) and \(w_y\) are the weights in stocks \(x\) and \(y\), \(r_x\) and \(r_y\) are the stock returns, \(\sigma^2\) is variance, and \(cov(.,.)\) is covariance.

If one asset is the risk free asset (borrowing a risk-free bond), then this asset has no variance and the covariance term is 0.0. Thus we are left with the result that if we leverage asset \(x\) by borrowing or lending the risk-free asset, then our leveraged portfolio's standard deviation (\(\sigma\)) is

\[ \sigma^2 = w_x^2 \sigma^2_x \rightarrow \sigma = w_x \sigma_x\]

let leveragedVol (weight: float, vol: float) = weight * vol

/// We're doing leverage in terms of weight on the risky asset.
/// 1 = 100%, 1.25 = 125%, etc.
let exampleLeverages =
    [ 1.0; 1.5; 2.0 ]

let rollingVolSubset =
    monthlyVol
    |> List.filter(fun (dt, vol) -> dt > DateTime(2020,1,1))

Let's write a function to leverage a list<DateTime * float>.

let leverageListOfVols leverage listOfVols =
    [ for (dt, vol) in listOfVols do 
        dt, leveragedVol (leverage, vol) ]

// A test list of vols
let exVols1 = 
    [ DateTime.Now, 0.1
      DateTime.Now, 0.15
      DateTime.Now, 0.05 ]

// testing the function
leverageListOfVols 1.5 exVols1

We could run it on the rollingVolSubset as well.

leverageListOfVols 1.5 rollingVolSubset

Now do the same for each of the example leverages.

let exampleLeveragedVols =
    [ for exLev in exampleLeverages do
        exLev, leverageListOfVols exLev rollingVolSubset ]

let exampleLeveragesChart =
    [ for (leverage, leveragedVols) in exampleLeveragedVols do
        Chart.Line(leveragedVols,Name= $"Levarage of {leverage}") ]
    |> Chart.combine

Effect of leverage on returns

The effect of leverage on returns can be seen from the portfolio return equation, \[r_p = \Sigma^N_{i=1} w_i r_i,\] where \(r\) is return, \(i\) indexes stocks, and \(w\) is portfolio weights.

So if we borrow 50% of our starting equity by getting a risk-free loan, then we have \[r_{\text{levered}} = 150\% \times r_{\text{unlevered}} - 50\% \times r_f\]

If we put in terms of excess returns, \[r_{\text{levered}} - r_f = 150\% \times (r_{\text{unlevered}}-r_f) - 50\% \times (r_f-r_f)=150\% \times (r_{\text{unlevered}}-r_f)\]

So, if we work in excess returns we can just multiply unlevered excess returns by the weight.

Managed Portfolios.

let since2020 = 
    ff3 |> List.filter(fun x -> x.Date >= DateTime(2020,1,1))

let cumulativeReturn (xs: list<DateTime * float>) =
    let xs = xs |> List.sortBy (fun (dt, r) -> dt)
    let mutable cr = 0.0
    [ for (dt, r) in xs do
        cr <- (1.0 + cr) * (1.0 + r) - 1.0
        dt, cr ]
        
let cumulativeReturnEx =
    since2020
    |> List.map (fun x -> x.Date, x.MktRf)
    |> cumulativeReturn

let cumulativeReturnExPlot =
    cumulativeReturnEx
    |> Chart.Line

Let's try leverage with daily rebalancing. The leverage argument quantifies the amount of leverage.

let getLeveragedReturn leverage =
    since2020 
    |> List.map (fun x -> x.Date, leverage * x.MktRf)
    |> cumulativeReturn

Compare leverage of 1:

getLeveragedReturn 1.0
|> List.take 3

To leverage of 2:

getLeveragedReturn 2.0
|> List.take 3

We can do this for all our example leverages.

let exampleLeveragedReturn =
    [ for exLev in exampleLeverages do 
        exLev, getLeveragedReturn exLev ]

// Look at the first few observations
exampleLeveragedReturn
|> List.map (fun (exLev, levReturn) ->
    exLev, levReturn |> List.take 3)

Turn it into a chart.

let exampleLeveragedReturnChart = 
    [ for (exLev, levReturn) in exampleLeveragedReturn do 
        Chart.Line(levReturn, Name= $"Leverage of {exLev}") ] 
    |> Chart.combine

Predicting volatility

To manage or target volatility, we need to be able to predict volatility. A simple model would be to use past sample volatility to predict future volatility. How well does this work?

Let's start by creating a dataset that has the past 22 days as a training period and the 23rd day as a test period. We'll look at how volatility the past 22 days predicts volatility on the 23rd day.

type DaysWithTrailing = 
    { Train: list<FF3Obs> 
      Test: FF3Obs }
let daysWithTrailingVol =
    ff3 
    |> List.sortBy(fun x -> x.Date)
    |> List.windowed 23
    |> List.map(fun xs ->
        let train = xs |> List.take (xs.Length-1)
        let test = xs |> List.last
        { Train = train; Test = test })

This is a list of records where Train is the 22-day training dataset and the Test is the 23rd day that we use as the test date.

Look at the training data.

daysWithTrailingVol[0].Train

Look at the test data.

daysWithTrailingVol[0].Test

One way to do this is to look at the correlation between volatilities. What is the correlation between volatility the past 22 days (training observations) and volatility on the 23rd day (test observation)?

How do we measure volatility that last (23rd) day? You can't calculate a standard deviation of returns when there is one day. You need multiple days. But we can create a pseudo 1-day standard deviation by using the absolute value of the return that last day.

open Correlation

type TrainTestVols = 
    { TrainVol: float 
      TestVol: float }

let trainVsTest =
    [ for x in daysWithTrailingVol do 
        let trainSd = x.Train |> stDevBy(fun x -> x.MktRf)
        let testSd = abs(x.Test.MktRf)
        { TrainVol = annualizeDaily trainSd
          TestVol = annualizeDaily testSd } ]

// What's that look like?
trainVsTest[..10]

The correlation:

trainVsTest
|> List.map (fun vols -> vols.TrainVol, vols.TestVol) 
|> pearsonOfPairs
0.4624279841

Another way is to try sorting days into 20 groups based on trailing 22-day volatility. Then we'll see if this sorts actual realized volatility. Think of this as splitting days into 20 groups along the x-axis and comparing the typical x-axis value to the typical y-axis value.

let twentyChunksByTrainVol =
    trainVsTest
    |> List.sortBy (fun vols -> vols.TrainVol)
    |> List.splitInto 20

A bin-scatterplot.

let binScatterData =
    [ for chunk in twentyChunksByTrainVol do 
        let avgTrain = chunk |> List.averageBy (fun vols -> vols.TrainVol)
        let avgTest = chunk |> List.averageBy (fun vols -> vols.TestVol)
        avgTrain, avgTest ]

// the data
binScatterData

Now a scatterplot of it.

let binScatterPlot = 
    binScatterData
    |> Chart.Point

Even with this very simple volatility model, we seem to do a reasonable job predicting volatility. We get a decent spread.

Targetting volatility

How can we target volatility? Recall our formula for a portfolio's standard deviation if we're allocating between the risk-free asset and a risky asset: \[\sigma = w_x \sigma_x\] If we choose \[w_x=\frac{\text{target volatility}}{\text{predicted volatility}}=\frac{\text{target}}{\hat{\sigma}_x}\] then we get \[\sigma = \frac{\text{target}\times \sigma_x}{\hat{\sigma}_x}\]

We're not going to predict volatility perfectly, but if we did then we'd have a portfolio that had a constant volatility equal to our target.

Let's see what happens if we try to target 15% annualized volatility.

type VolPosition =
    { Date : DateTime 
      Return : float 
      Weight : float }

/// This is the daily returns of a strategy targetting 15\% annualized volatility.
let targetted =
    daysWithTrailingVol
    |> List.map(fun x -> 
        let predicted = x.Train |> stDevBy(fun x -> x.MktRf) |> annualizeDaily
        let w = (15.0/predicted) // 15.0 is the target
        { Date = x.Test.Date
          Return = x.Test.MktRf * w 
          Weight = w })

This is volatility of the strategy each month since 2019.

let targettedSince2019MonthlyVol =
    targetted
    |> List.filter(fun x -> x.Date >= DateTime(2019,1,1) )
    |> List.groupBy(fun x -> x.Date.Year, x.Date.Month)
    |> List.map(fun (_, xs) -> 
        let lastDayOfMonth = xs |> List.map(fun x -> x.Date) |> List.max
        let strategyVolatility = xs |> stDevBy(fun x -> x.Return) |> annualizeDaily
        lastDayOfMonth, strategyVolatility) 

This is a chart of the monthly volatilities.

let targettedSince2019Chart = 
    targettedSince2019MonthlyVol
    |> volChart 
    |> Chart.withTraceInfo(Name="Managed")

For comparison, this is monthly volatility of buy-and-hold 100\% weight on the market.

let rawSince2019Chart =
    monthlyVol
    |> List.filter(fun (dt,_) -> dt >= DateTime(2019,1,1))
    |> volChart
    |> Chart.withTraceInfo(Name="Unmangaged")

This chart combines the two, comparing the volatility managed portfolio to the unmanaged buy-and-hold version.

let volComparison = 
    [ targettedSince2019Chart; rawSince2019Chart]
    |> Chart.combine

We can also add the targetted strategy's weights.

let targettedWeightsSince2019Chart = 
    targetted
    |> List.filter(fun x -> x.Date >= DateTime(2019,1,1) )
    |> List.groupBy(fun x -> x.Date.Year, x.Date.Month)
    |> List.map(fun (_, xs) -> 
        xs |> List.map(fun x -> x.Date) |> Seq.max,
        xs |> List.averageBy(fun x -> x.Weight))
    |> Chart.Line 
    |> Chart.withTraceInfo(Name="weight on the Market")

let volComparisonWithWeights =
    [volComparison; targettedWeightsSince2019Chart ]
    |> Chart.SingleStack()

We can see that in this example,

Evaluating performance.

Let's now compare buy and hold to our managed volatility strategy.

For the managed portfolio, we'll also impose the constraint that the investor cannot borrow more than 30% of their equity (i.e, max weight = 1.3).

We start by defining functions to calculate the weights. In the managed weights, we set the numerator so that we're targetting the full-sample standard deviation of the market.

let leverageLimit = 1.3

let sampleStdDev = 
    daysWithTrailingVol 
    |> stDevBy(fun x -> x.Test.MktRf)
    |> annualizeDaily

let buyHoldWeight predictedStdDev = 1.0

let inverseStdDevWeight predictedStdDev = 
    min (sampleStdDev / predictedStdDev) leverageLimit

let inverseStdDevNoLeverageLimit predictedStdDev = 
    sampleStdDev / predictedStdDev

Practice: Write a function that takes predictedStdDev as its only input and outputs the desired weight for a mean-variance investor who has \(\gamma=3\) and expects the market excess return to be 7% per year.

// answer here

Some examples:

let weightExampleLineChart weightFun name =
    [ for sd in [ 5.0 .. 65.0] do sd, weightFun sd ]
    |> Chart.Line
    |> Chart.withTraceInfo(Name=name)
    |> Chart.withXAxisStyle(TitleText="Predicted volatility")
    |> Chart.withYAxisStyle(TitleText="Portfolio weight")



weightExampleLineChart buyHoldWeight "Buy-Hold"

Combining:

let combinedWeightChart =
    [ weightExampleLineChart buyHoldWeight "Buy-Hold"
      weightExampleLineChart inverseStdDevNoLeverageLimit "Inverse StdDev No Limit" 
      weightExampleLineChart inverseStdDevWeight "Inverse StdDev"]
    |> Chart.combine

Practice: Add your mean-variance weight function to the graph.

// answer here

A function to construct the backtest given a weighting function.

let getManaged weightFun days =
    days
    |> List.map(fun day -> 
        let predicted = day.Train |> stDevBy(fun x -> x.MktRf) |> annualizeDaily
        let w = weightFun predicted
        { Date = day.Test.Date
          Return = day.Test.MktRf * w 
          Weight = w })

/// Rescale to desired SD for
/// more interpretable graphs. 
/// Does not affect sharpe ratio
let rescaleToVol desiredVol xs =
    let sd = xs |> stDevBy(fun x -> x.Return) |> annualizeDaily
    [ for x in xs do 
        { x with Return = x.Return * (desiredVol/sd)}]

Function to accumulate the returns.

let accVolPortReturn (port: List<VolPosition>) =
    port
    |> List.map (fun x -> x.Date, x.Return)
    |> cumulativeReturn
    |> List.map (fun (dt, ret) ->
        // because we will do log plot later,
        // so return must be > 0. So make
        // 1.0 = 0% cumulative return
        dt, 1.0 + ret)

(** Now making the 3 strategies. *)    
let buyHoldMktPort = 
    daysWithTrailingVol 
    |> getManaged buyHoldWeight 
    |> rescaleToVol sampleStdDev
let managedMktPort = 
    daysWithTrailingVol
    |> getManaged inverseStdDevWeight
    |> rescaleToVol sampleStdDev
let managedMktPortNoLimit = 
    daysWithTrailingVol
    |> getManaged inverseStdDevNoLeverageLimit
    |> rescaleToVol sampleStdDev 

A function to make a chart.

let portChart name port  = 
    port 
    |> Chart.Line
    |> Chart.withTraceInfo(Name=name)
    |> Chart.withYAxis (LayoutObjects.LinearAxis.init(AxisType = StyleParam.AxisType.Log))

let bhVsManagedChart =
    Chart.combine(
        [ buyHoldMktPort |> accVolPortReturn |> (portChart "Buy-Hold")
          managedMktPort |> accVolPortReturn |> (portChart "Managed Vol")
          managedMktPortNoLimit |> accVolPortReturn |> (portChart "Managed Vol No Limit")
          ])

Practice: Make a chart comparing the three strategies starting from 2020-01-01.

let summarisePortfolio (portfolio, name) =
    let mu = 
        let mu = portfolio |> List.averageBy(fun x -> x.Return) 
        round 2 (100.0*252.0*mu)
    let sd = portfolio |> stDevBy(fun x -> x.Return) |> annualizeDaily
    printfn $"Name: %25s{name} Mean: %.2f{mu} SD: %.2f{sd} Sharpe: %.3f{round 3 (mu/sd)}"

summarisePortfolio (buyHoldMktPort, "Buy-Hold Mkt")

Now let's compare the performance of the managed portfolio to the buy and hold portfolio.

let listOfAllPortfolios =
    [ buyHoldMktPort, "Buy-Hold Mkt"
      managedMktPort, "Managed Vol Mkt"
      managedMktPortNoLimit, "Manage Vol No Limit"]

for port in listOfAllPortfolios do 
    summarisePortfolio port
Name:              Buy-Hold Mkt Mean: 7.60 SD: 17.16 Sharpe: 0.443
Name:           Managed Vol Mkt Mean: 9.41 SD: 17.16 Sharpe: 0.548
Name:       Manage Vol No Limit Mean: 9.75 SD: 17.16 Sharpe: 0.568

Things to consider

namespace System
Multiple items
namespace FSharp

--------------------
namespace Microsoft.FSharp
Multiple items
namespace FSharp.Data

--------------------
namespace Microsoft.FSharp.Data
namespace NovaSBE
namespace NovaSBE.Finance
module French from NovaSBE.Finance
val ff3: FF3Obs list
val getFF3: frequency: Frequency -> FF3Obs array
type Frequency = | Daily | Monthly
union case Frequency.Daily: Frequency
type Array = interface ICollection interface IEnumerable interface IList interface IStructuralComparable interface IStructuralEquatable interface ICloneable member Clone: unit -> obj member CopyTo: array: Array * index: int -> unit + 1 overload member GetEnumerator: unit -> IEnumerator member GetLength: dimension: int -> int ...
<summary>Provides methods for creating, manipulating, searching, and sorting arrays, thereby serving as the base class for all arrays in the common language runtime.</summary>
val toList: array: 'T array -> 'T list
Multiple items
module List from Microsoft.FSharp.Collections

--------------------
type List<'T> = | op_Nil | op_ColonColon of Head: 'T * Tail: 'T list interface IReadOnlyList<'T> interface IReadOnlyCollection<'T> interface IEnumerable interface IEnumerable<'T> member GetReverseIndex: rank: int * offset: int -> int member GetSlice: startIndex: int option * endIndex: int option -> 'T list static member Cons: head: 'T * tail: 'T list -> 'T list member Head: 'T member IsEmpty: bool member Item: index: int -> 'T with get ...
val take: count: int -> list: 'T list -> 'T list
namespace FSharp.Stats
namespace Plotly
namespace Plotly.NET
val annualizeDaily: x: float -> float
val x: float
val sqrt: value: 'T -> 'U (requires member Sqrt)
val daysByMonth: ((int * int) * FF3Obs list) list
Multiple items
module List from FSharp.Stats
<summary> Module to compute common statistical measure on list </summary>

--------------------
module List from Microsoft.FSharp.Collections

--------------------
type List = new: unit -> List static member geomspace: start: float * stop: float * num: int * ?IncludeEndpoint: bool -> float list static member linspace: start: float * stop: float * num: int * ?IncludeEndpoint: bool -> float list

--------------------
type List<'T> = | op_Nil | op_ColonColon of Head: 'T * Tail: 'T list interface IReadOnlyList<'T> interface IReadOnlyCollection<'T> interface IEnumerable interface IEnumerable<'T> member GetReverseIndex: rank: int * offset: int -> int member GetSlice: startIndex: int option * endIndex: int option -> 'T list static member Cons: head: 'T * tail: 'T list -> 'T list member Head: 'T member IsEmpty: bool member Item: index: int -> 'T with get ...

--------------------
new: unit -> List
val groupBy: projection: ('T -> 'Key) -> list: 'T list -> ('Key * 'T list) list (requires equality)
val x: FF3Obs
FF3Obs.Date: DateTime
property DateTime.Year: int with get
<summary>Gets the year component of the date represented by this instance.</summary>
<returns>The year, between 1 and 9999.</returns>
property DateTime.Month: int with get
<summary>Gets the month component of the date represented by this instance.</summary>
<returns>The month component, expressed as a value between 1 and 12.</returns>
val testMonth: (int * int) * FF3Obs list
val testMonthGroup: int * int
val testMonthObs: FF3Obs list
val map: mapping: ('T -> 'U) -> list: 'T list -> 'U list
FF3Obs.MktRf: float
val stDev: items: 'T seq -> 'U (requires member (-) and member Zero and member DivideByInt and member (+) and member ( * ) and member (+) and member (/) and member Sqrt)
<summary> Computes the sample standard deviation </summary>
<param name="items">The input sequence.</param>
<remarks>Returns NaN if data is empty or if any entry is NaN.</remarks>
<returns>standard deviation of a sample (Bessel's correction by N-1)</returns>
val year: int
val month: int
val xs: FF3Obs list
val lastDayOb: FF3Obs
val sortBy: projection: ('T -> 'Key) -> list: 'T list -> 'T list (requires comparison)
val last: list: 'T list -> 'T
val lastDate: DateTime
val annualizedVolPct: float
val monthlyVol: (DateTime * float) list
val _ym: int * int
val lastOb: FF3Obs
val stDevBy: f: ('T -> 'a) -> items: 'T seq -> 'U (requires member (-) and member Zero and member DivideByInt and member (+) and member ( * ) and member (+) and member (/) and member Sqrt)
<summary> Computes the sample standard deviation </summary>
<param name="f">A function applied to transform each element of the sequence.</param>
<param name="items">The input sequence.</param>
<remarks>Returns NaN if data is empty or if any entry is NaN.</remarks>
<returns>standard deviation of a sample (Bessel's correction by N-1)</returns>
val volChart: vols: (DateTime * float) list -> GenericChart.GenericChart
val vols: (DateTime * float) list
type 'T list = List<'T>
Multiple items
[<Struct>] type DateTime = new: year: int * month: int * day: int -> unit + 16 overloads member Add: value: TimeSpan -> DateTime member AddDays: value: float -> DateTime member AddHours: value: float -> DateTime member AddMicroseconds: value: float -> DateTime member AddMilliseconds: value: float -> DateTime member AddMinutes: value: float -> DateTime member AddMonths: months: int -> DateTime member AddSeconds: value: float -> DateTime member AddTicks: value: int64 -> DateTime ...
<summary>Represents an instant in time, typically expressed as a date and time of day.</summary>

--------------------
DateTime ()
   (+0 other overloads)
DateTime(ticks: int64) : DateTime
   (+0 other overloads)
DateTime(ticks: int64, kind: DateTimeKind) : DateTime
   (+0 other overloads)
DateTime(date: DateOnly, time: TimeOnly) : DateTime
   (+0 other overloads)
DateTime(year: int, month: int, day: int) : DateTime
   (+0 other overloads)
DateTime(date: DateOnly, time: TimeOnly, kind: DateTimeKind) : DateTime
   (+0 other overloads)
DateTime(year: int, month: int, day: int, calendar: Globalization.Calendar) : DateTime
   (+0 other overloads)
DateTime(year: int, month: int, day: int, hour: int, minute: int, second: int) : DateTime
   (+0 other overloads)
DateTime(year: int, month: int, day: int, hour: int, minute: int, second: int, kind: DateTimeKind) : DateTime
   (+0 other overloads)
DateTime(year: int, month: int, day: int, hour: int, minute: int, second: int, calendar: Globalization.Calendar) : DateTime
   (+0 other overloads)
Multiple items
val float: value: 'T -> float (requires member op_Explicit)

--------------------
type float = Double

--------------------
type float<'Measure> = float
val years: int list
val dt: DateTime
val _vol: float
val minYear: int
val min: list: 'T list -> 'T (requires comparison)
val maxYear: int
val max: list: 'T list -> 'T (requires comparison)
type Chart = static member AnnotatedHeatmap: zData: #('a1 seq) seq * annotationText: #(string seq) seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Name: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?X: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?XGap: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Y: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?YGap: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Text: 'a5 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiText: 'a5 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?ColorBar: ColorBar * [<Optional; DefaultParameterValue ((null :> obj))>] ?ColorScale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ReverseScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZSmooth: SmoothAlg * [<Optional; DefaultParameterValue ((null :> obj))>] ?Transpose: bool * [<Optional; DefaultParameterValue ((false :> obj))>] ?UseWebGL: bool * [<Optional; DefaultParameterValue ((false :> obj))>] ?ReverseYAxis: bool * [<Optional; DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart (requires 'a1 :> IConvertible and 'a5 :> IConvertible) + 1 overload static member Area: x: #IConvertible seq * y: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowMarkers: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Name: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Text: 'a2 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiText: 'a2 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TextPosition: TextPosition * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: TextPosition seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerColorScale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerSymbol: MarkerSymbol * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiMarkerSymbol: MarkerSymbol seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Marker: Marker * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineColorScale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineDash: DrawingStyle * [<Optional; DefaultParameterValue ((null :> obj))>] ?Line: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?StackGroup: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?Orientation: Orientation * [<Optional; DefaultParameterValue ((null :> obj))>] ?GroupNorm: GroupNorm * [<Optional; DefaultParameterValue ((null :> obj))>] ?FillColor: Color * [<Optional; DefaultParameterValue ((false :> obj))>] ?UseWebGL: bool * [<Optional; DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart (requires 'a2 :> IConvertible) + 1 overload static member Bar: values: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Keys: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Name: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Text: 'a2 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiText: 'a2 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerColorScale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerPatternShape: PatternShape * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiMarkerPatternShape: PatternShape seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerPattern: Pattern * [<Optional; DefaultParameterValue ((null :> obj))>] ?Marker: Marker * [<Optional; DefaultParameterValue ((null :> obj))>] ?Base: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?Width: 'a4 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiWidth: 'a4 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TextPosition: TextPosition * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: TextPosition seq * [<Optional; DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart (requires 'a2 :> IConvertible and 'a4 :> IConvertible) + 1 overload static member BoxPlot: [<Optional; DefaultParameterValue ((null :> obj))>] ?X: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Y: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Name: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Text: 'a2 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiText: 'a2 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?FillColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?Marker: Marker * [<Optional; DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?WhiskerWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?BoxPoints: BoxPoints * [<Optional; DefaultParameterValue ((null :> obj))>] ?BoxMean: BoxMean * [<Optional; DefaultParameterValue ((null :> obj))>] ?Jitter: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?PointPos: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Orientation: Orientation * [<Optional; DefaultParameterValue ((null :> obj))>] ?OutlineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?OutlineWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Outline: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?AlignmentGroup: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?OffsetGroup: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?Notched: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?NotchWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?QuartileMethod: QuartileMethod * [<Optional; DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart (requires 'a2 :> IConvertible) + 2 overloads static member Bubble: x: #IConvertible seq * y: #IConvertible seq * sizes: int seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Name: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Text: 'a2 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiText: 'a2 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TextPosition: TextPosition * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: TextPosition seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerColorScale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerSymbol: MarkerSymbol * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiMarkerSymbol: MarkerSymbol seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Marker: Marker * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineColorScale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineDash: DrawingStyle * [<Optional; DefaultParameterValue ((null :> obj))>] ?Line: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?StackGroup: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?Orientation: Orientation * [<Optional; DefaultParameterValue ((null :> obj))>] ?GroupNorm: GroupNorm * [<Optional; DefaultParameterValue ((false :> obj))>] ?UseWebGL: bool * [<Optional; DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart (requires 'a2 :> IConvertible) + 1 overload static member Candlestick: ``open`` : #IConvertible seq * high: #IConvertible seq * low: #IConvertible seq * close: #IConvertible seq * x: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Name: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Text: 'a5 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiText: 'a5 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Line: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?IncreasingColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?Increasing: FinanceMarker * [<Optional; DefaultParameterValue ((null :> obj))>] ?DecreasingColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?Decreasing: FinanceMarker * [<Optional; DefaultParameterValue ((null :> obj))>] ?WhiskerWidth: float * [<Optional; DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart (requires 'a5 :> IConvertible) + 1 overload static member Column: values: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Keys: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Name: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Text: 'a2 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiText: 'a2 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerColorScale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerPatternShape: PatternShape * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiMarkerPatternShape: PatternShape seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerPattern: Pattern * [<Optional; DefaultParameterValue ((null :> obj))>] ?Marker: Marker * [<Optional; DefaultParameterValue ((null :> obj))>] ?Base: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?Width: 'a4 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiWidth: 'a4 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TextPosition: TextPosition * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: TextPosition seq * [<Optional; DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart (requires 'a2 :> IConvertible and 'a4 :> IConvertible) + 1 overload static member Contour: zData: #('a1 seq) seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Name: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?X: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Y: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Text: 'a4 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiText: 'a4 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?ColorBar: ColorBar * [<Optional; DefaultParameterValue ((null :> obj))>] ?ColorScale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ReverseScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Transpose: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ContourLineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ContourLineDash: DrawingStyle * [<Optional; DefaultParameterValue ((null :> obj))>] ?ContourLineSmoothing: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ContourLine: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?ContoursColoring: ContourColoring * [<Optional; DefaultParameterValue ((null :> obj))>] ?ContoursOperation: ConstraintOperation * [<Optional; DefaultParameterValue ((null :> obj))>] ?ContoursType: ContourType * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowContourLabels: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ContourLabelFont: Font * [<Optional; DefaultParameterValue ((null :> obj))>] ?Contours: Contours * [<Optional; DefaultParameterValue ((null :> obj))>] ?FillColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?NContours: int * [<Optional; DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart (requires 'a1 :> IConvertible and 'a4 :> IConvertible) static member Funnel: x: #IConvertible seq * y: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Name: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Width: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Offset: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Text: 'a2 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiText: 'a2 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TextPosition: TextPosition * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: TextPosition seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Orientation: Orientation * [<Optional; DefaultParameterValue ((null :> obj))>] ?AlignmentGroup: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?OffsetGroup: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?Marker: Marker * [<Optional; DefaultParameterValue ((null :> obj))>] ?TextInfo: TextInfo * [<Optional; DefaultParameterValue ((null :> obj))>] ?ConnectorLineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ConnectorLineStyle: DrawingStyle * [<Optional; DefaultParameterValue ((null :> obj))>] ?ConnectorFillColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ConnectorLine: Line * [<Optional; DefaultParameterValue ((null :> obj))>] ?Connector: FunnelConnector * [<Optional; DefaultParameterValue ((null :> obj))>] ?InsideTextFont: Font * [<Optional; DefaultParameterValue ((null :> obj))>] ?OutsideTextFont: Font * [<Optional; DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart (requires 'a2 :> IConvertible) static member Heatmap: zData: #('a1 seq) seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Name: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?X: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?XGap: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Y: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?YGap: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Text: 'a4 * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiText: 'a4 seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?ColorBar: ColorBar * [<Optional; DefaultParameterValue ((null :> obj))>] ?ColorScale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ReverseScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZSmooth: SmoothAlg * [<Optional; DefaultParameterValue ((null :> obj))>] ?Transpose: bool * [<Optional; DefaultParameterValue ((false :> obj))>] ?UseWebGL: bool * [<Optional; DefaultParameterValue ((false :> obj))>] ?ReverseYAxis: bool * [<Optional; DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart (requires 'a1 :> IConvertible and 'a4 :> IConvertible) + 1 overload ...
static member Chart.Column: keysValues: (#IConvertible * #IConvertible) seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Name: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Text: 'c * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiText: 'c seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColorScale: StyleParam.Colorscale * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerPatternShape: StyleParam.PatternShape * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiMarkerPatternShape: StyleParam.PatternShape seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerPattern: TraceObjects.Pattern * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Marker: TraceObjects.Marker * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Base: #IConvertible * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Width: 'e * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiWidth: 'e seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TextPosition: StyleParam.TextPosition * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: StyleParam.TextPosition seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart.GenericChart (requires 'c :> IConvertible and 'e :> IConvertible)
static member Chart.Column: values: #IConvertible seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Keys: #IConvertible seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Name: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Text: 'a2 * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiText: 'a2 seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColorScale: StyleParam.Colorscale * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerPatternShape: StyleParam.PatternShape * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiMarkerPatternShape: StyleParam.PatternShape seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerPattern: TraceObjects.Pattern * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Marker: TraceObjects.Marker * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Base: #IConvertible * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Width: 'a4 * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiWidth: 'a4 seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TextPosition: StyleParam.TextPosition * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: StyleParam.TextPosition seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart.GenericChart (requires 'a2 :> IConvertible and 'a4 :> IConvertible)
static member Chart.withMarkerStyle: [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?AutoColorScale: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CAuto: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CMax: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CMid: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CMin: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Colors: Color seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ColorAxis: StyleParam.SubPlotId * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ColorBar: ColorBar * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Colorscale: StyleParam.Colorscale * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Gradient: TraceObjects.Gradient * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Outline: Line * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MaxDisplayed: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Pattern: TraceObjects.Pattern * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ReverseScale: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowScale: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Size: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiSize: int seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SizeMin: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SizeMode: StyleParam.MarkerSizeMode * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SizeRef: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Symbol: StyleParam.MarkerSymbol * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiSymbol: StyleParam.MarkerSymbol seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Symbol3D: StyleParam.MarkerSymbol3D * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiSymbol3D: StyleParam.MarkerSymbol3D seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?OutlierColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?OutlierWidth: int -> (GenericChart.GenericChart -> GenericChart.GenericChart)
Multiple items
type Line = inherit DynamicObj new: unit -> Line static member init: [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoColorScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?CAuto: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?CMax: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?CMid: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?CMin: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ColorAxis: SubPlotId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Colorscale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?ReverseScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ColorBar: ColorBar * [<Optional; DefaultParameterValue ((null :> obj))>] ?Dash: DrawingStyle * [<Optional; DefaultParameterValue ((null :> obj))>] ?Shape: Shape * [<Optional; DefaultParameterValue ((null :> obj))>] ?Simplify: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Smoothing: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Width: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiWidth: float seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?OutlierColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?OutlierWidth: float -> Line static member style: [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoColorScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?CAuto: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?CMax: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?CMid: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?CMin: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ColorAxis: SubPlotId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Colorscale: Colorscale * [<Optional; DefaultParameterValue ((null :> obj))>] ?ReverseScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowScale: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ColorBar: ColorBar * [<Optional; DefaultParameterValue ((null :> obj))>] ?Dash: DrawingStyle * [<Optional; DefaultParameterValue ((null :> obj))>] ?Shape: Shape * [<Optional; DefaultParameterValue ((null :> obj))>] ?Simplify: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Smoothing: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Width: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?MultiWidth: float seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?OutlierColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?OutlierWidth: float -> (Line -> Line)
<summary> The line object determines the style of the line in various aspect of plots such as a line connecting datums, outline of layout objects, etc.. </summary>

--------------------
new: unit -> Line
static member Line.init: [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?AutoColorScale: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CAuto: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CMax: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CMid: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CMin: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ColorAxis: StyleParam.SubPlotId * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Colorscale: StyleParam.Colorscale * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ReverseScale: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowScale: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ColorBar: ColorBar * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Dash: StyleParam.DrawingStyle * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Shape: StyleParam.Shape * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Simplify: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Smoothing: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Width: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiWidth: float seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?OutlierColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?OutlierWidth: float -> Line
type Color = override Equals: other: obj -> bool override GetHashCode: unit -> int static member fromARGB: a: int -> r: int -> g: int -> b: int -> Color static member fromColorScaleValues: c: #IConvertible seq -> Color static member fromColors: c: Color seq -> Color static member fromHex: s: string -> Color static member fromKeyword: c: ColorKeyword -> Color static member fromRGB: r: int -> g: int -> b: int -> Color static member fromString: c: string -> Color member Value: obj
<summary> Plotly color can be a single color, a sequence of colors, or a sequence of numeric values referencing the color of the colorscale obj </summary>
static member Color.fromKeyword: c: ColorKeyword -> Color
type ColorKeyword = | AliceBlue | AntiqueWhite | Aqua | Aquamarine | Azure | Beige | Bisque | Black | BlanchedAlmond | Blue ... static member ofKeyWord: (string -> ColorKeyword) static member toRGB: (ColorKeyword -> int * int * int)
<summary> https://www.w3.org/TR/2011/REC-SVG11-20110816/types.html#ColorKeywords W3C Recognized color keyword names </summary>
union case ColorKeyword.Blue: ColorKeyword
static member Chart.withXAxisStyle: [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TitleText: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TitleFont: Font * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TitleStandoff: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Title: Title * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?AxisType: StyleParam.AxisType * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MinMax: (#IConvertible * #IConvertible) * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Mirror: StyleParam.Mirror * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowSpikes: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SpikeColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SpikeThickness: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowLine: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowGrid: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?GridColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ZeroLine: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ZeroLineColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Anchor: StyleParam.LinearAxisId * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Side: StyleParam.Side * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Overlaying: StyleParam.LinearAxisId * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Domain: (float * float) * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Position: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CategoryOrder: StyleParam.CategoryOrder * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CategoryArray: #IConvertible seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?RangeSlider: LayoutObjects.RangeSlider * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?RangeSelector: LayoutObjects.RangeSelector * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?BackgroundColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowBackground: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Id: StyleParam.SubPlotId -> (GenericChart.GenericChart -> GenericChart.GenericChart)
static member Chart.withYAxisStyle: [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TitleText: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TitleFont: Font * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TitleStandoff: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Title: Title * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?AxisType: StyleParam.AxisType * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MinMax: (#IConvertible * #IConvertible) * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Mirror: StyleParam.Mirror * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowSpikes: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SpikeColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SpikeThickness: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowLine: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowGrid: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?GridColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ZeroLine: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ZeroLineColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Anchor: StyleParam.LinearAxisId * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Side: StyleParam.Side * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Overlaying: StyleParam.LinearAxisId * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Domain: (float * float) * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Position: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CategoryOrder: StyleParam.CategoryOrder * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CategoryArray: #IConvertible seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?RangeSlider: LayoutObjects.RangeSlider * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?RangeSelector: LayoutObjects.RangeSelector * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?BackgroundColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowBackground: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Id: StyleParam.SubPlotId -> (GenericChart.GenericChart -> GenericChart.GenericChart)
val allVolsChart: GenericChart.GenericChart
module GenericChart from Plotly.NET
<summary> Module to represent a GenericChart </summary>
val toChartHTML: gChart: GenericChart.GenericChart -> string
<summary> Converts a GenericChart to it HTML representation. The div layer has a default size of 600 if not specified otherwise. </summary>
val since2019VolChart: GenericChart.GenericChart
val filter: predicate: ('T -> bool) -> list: 'T list -> 'T list
val leveragedVol: weight: float * vol: float -> float
val weight: float
val vol: float
val exampleLeverages: float list
 We're doing leverage in terms of weight on the risky asset.
 1 = 100%, 1.25 = 125%, etc.
val rollingVolSubset: (DateTime * float) list
val leverageListOfVols: leverage: float -> listOfVols: ('a * float) seq -> ('a * float) list
val leverage: float
val listOfVols: ('a * float) seq
val dt: 'a
val exVols1: (DateTime * float) list
property DateTime.Now: DateTime with get
<summary>Gets a <see cref="T:System.DateTime" /> object that is set to the current date and time on this computer, expressed as the local time.</summary>
<returns>An object whose value is the current local date and time.</returns>
val exampleLeveragedVols: (float * (DateTime * float) list) list
val exLev: float
val exampleLeveragesChart: GenericChart.GenericChart
val leveragedVols: (DateTime * float) list
static member Chart.Line: xy: (#IConvertible * #IConvertible) seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowMarkers: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Name: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Text: 'c * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiText: 'c seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TextPosition: StyleParam.TextPosition * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: StyleParam.TextPosition seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColorScale: StyleParam.Colorscale * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerSymbol: StyleParam.MarkerSymbol * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiMarkerSymbol: StyleParam.MarkerSymbol seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Marker: TraceObjects.Marker * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineColorScale: StyleParam.Colorscale * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineWidth: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineDash: StyleParam.DrawingStyle * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Line: Line * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?StackGroup: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Orientation: StyleParam.Orientation * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?GroupNorm: StyleParam.GroupNorm * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Fill: StyleParam.Fill * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?FillColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((false :> obj))>] ?UseWebGL: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart.GenericChart (requires 'c :> IConvertible)
static member Chart.Line: x: #IConvertible seq * y: #IConvertible seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowMarkers: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Name: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Text: 'a2 * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiText: 'a2 seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TextPosition: StyleParam.TextPosition * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: StyleParam.TextPosition seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColorScale: StyleParam.Colorscale * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerSymbol: StyleParam.MarkerSymbol * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiMarkerSymbol: StyleParam.MarkerSymbol seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Marker: TraceObjects.Marker * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineColorScale: StyleParam.Colorscale * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineWidth: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineDash: StyleParam.DrawingStyle * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Line: Line * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?StackGroup: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Orientation: StyleParam.Orientation * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?GroupNorm: StyleParam.GroupNorm * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Fill: StyleParam.Fill * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?FillColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((false :> obj))>] ?UseWebGL: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart.GenericChart (requires 'a2 :> IConvertible)
static member Chart.combine: gCharts: GenericChart.GenericChart seq -> GenericChart.GenericChart
val since2020: FF3Obs list
val cumulativeReturn: xs: (DateTime * float) list -> (DateTime * float) list
val xs: (DateTime * float) list
val r: float
val mutable cr: float
val cumulativeReturnEx: (DateTime * float) list
val cumulativeReturnExPlot: GenericChart.GenericChart
val getLeveragedReturn: leverage: float -> (DateTime * float) list
val exampleLeveragedReturn: (float * (DateTime * float) list) list
val levReturn: (DateTime * float) list
val exampleLeveragedReturnChart: GenericChart.GenericChart
type DaysWithTrailing = { Train: FF3Obs list Test: FF3Obs }
type FF3Obs = { Date: DateTime MktRf: float Smb: float Hml: float Rf: float Frequency: Frequency }
val daysWithTrailingVol: DaysWithTrailing list
val windowed: windowSize: int -> list: 'T list -> 'T list list
val train: FF3Obs list
property List.Length: int with get
val test: FF3Obs
module Correlation from FSharp.Stats
<summary> Contains correlation functions for different data types </summary>
type TrainTestVols = { TrainVol: float TestVol: float }
val trainVsTest: TrainTestVols list
val x: DaysWithTrailing
val trainSd: float
DaysWithTrailing.Train: FF3Obs list
val testSd: float
val abs: value: 'T -> 'T (requires member Abs)
DaysWithTrailing.Test: FF3Obs
val vols: TrainTestVols
TrainTestVols.TrainVol: float
TrainTestVols.TestVol: float
val pearsonOfPairs: seq: ('T * 'T) seq -> float (requires member op_Explicit and member Zero and member One)
<summary> Calculates the pearson correlation of two samples given as a sequence of paired values. Homoscedasticity must be assumed. </summary>
<param name="seq">The input sequence.</param>
<typeparam name="'T"></typeparam>
<returns>The pearson correlation.</returns>
<example><code> // Consider a sequence of paired x and y values: // [(x1, y1); (x2, y2); (x3, y3); (x4, y4); ... ] let xy = [(312.7, 315.5); (104.2, 101.3); (104.0, 108.0); (34.7, 32.2)] // To get the correlation between x and y: xy |&gt; Seq.pearsonOfPairs // evaluates to 0.9997053729 </code></example>
val twentyChunksByTrainVol: TrainTestVols list list
val splitInto: count: int -> list: 'T list -> 'T list list
val binScatterData: (float * float) list
val chunk: TrainTestVols list
val avgTrain: float
val averageBy: projection: ('T -> 'U) -> list: 'T list -> 'U (requires member (+) and member DivideByInt and member Zero)
val avgTest: float
val binScatterPlot: GenericChart.GenericChart
static member Chart.Point: xy: (#IConvertible * #IConvertible) seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Name: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Text: 'c * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiText: 'c seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TextPosition: StyleParam.TextPosition * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: StyleParam.TextPosition seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColorScale: StyleParam.Colorscale * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerSymbol: StyleParam.MarkerSymbol * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiMarkerSymbol: StyleParam.MarkerSymbol seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Marker: TraceObjects.Marker * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?StackGroup: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Orientation: StyleParam.Orientation * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?GroupNorm: StyleParam.GroupNorm * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((false :> obj))>] ?UseWebGL: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart.GenericChart (requires 'c :> IConvertible)
static member Chart.Point: x: #IConvertible seq * y: #IConvertible seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Name: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Opacity: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiOpacity: float seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Text: 'a2 * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiText: 'a2 seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TextPosition: StyleParam.TextPosition * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiTextPosition: StyleParam.TextPosition seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerColorScale: StyleParam.Colorscale * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerOutline: Line * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MarkerSymbol: StyleParam.MarkerSymbol * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MultiMarkerSymbol: StyleParam.MarkerSymbol seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Marker: TraceObjects.Marker * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?StackGroup: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Orientation: StyleParam.Orientation * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?GroupNorm: StyleParam.GroupNorm * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((false :> obj))>] ?UseWebGL: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((true :> obj))>] ?UseDefaults: bool -> GenericChart.GenericChart (requires 'a2 :> IConvertible)
type VolPosition = { Date: DateTime Return: float Weight: float }
val targetted: VolPosition list
 This is the daily returns of a strategy targetting 15\% annualized volatility.
val predicted: float
val w: float
val targettedSince2019MonthlyVol: (DateTime * float) list
val x: VolPosition
VolPosition.Date: DateTime
val xs: VolPosition list
val lastDayOfMonth: DateTime
val strategyVolatility: float
VolPosition.Return: float
val targettedSince2019Chart: GenericChart.GenericChart
static member Chart.withTraceInfo: [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Name: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Visible: StyleParam.Visible * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowLegend: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LegendRank: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LegendGroup: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LegendGroupTitle: Title -> (GenericChart.GenericChart -> GenericChart.GenericChart)
val rawSince2019Chart: GenericChart.GenericChart
val volComparison: GenericChart.GenericChart
val targettedWeightsSince2019Chart: GenericChart.GenericChart
Multiple items
module Seq from FSharp.Stats.Correlation
<summary> Contains correlation functions optimized for sequences </summary>

--------------------
module Seq from FSharp.Stats
<summary> Module to compute common statistical measure </summary>

--------------------
module Seq from Microsoft.FSharp.Collections

--------------------
type Seq = new: unit -> Seq static member geomspace: start: float * stop: float * num: int * ?IncludeEndpoint: bool -> float seq static member linspace: start: float * stop: float * num: int * ?IncludeEndpoint: bool -> float seq

--------------------
new: unit -> Seq
val max: source: 'T seq -> 'T (requires comparison)
VolPosition.Weight: float
val volComparisonWithWeights: GenericChart.GenericChart
static member Chart.SingleStack: [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SubPlots: (StyleParam.LinearAxisId * StyleParam.LinearAxisId) array array * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?XAxes: StyleParam.LinearAxisId array * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?YAxes: StyleParam.LinearAxisId array * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?RowOrder: StyleParam.LayoutGridRowOrder * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Pattern: StyleParam.LayoutGridPattern * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?XGap: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?YGap: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Domain: LayoutObjects.Domain * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?XSide: StyleParam.LayoutGridXSide * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?YSide: StyleParam.LayoutGridYSide -> (#(GenericChart.GenericChart seq) -> GenericChart.GenericChart)
val leverageLimit: float
val sampleStdDev: float
val buyHoldWeight: predictedStdDev: 'a -> float
val predictedStdDev: 'a
val inverseStdDevWeight: predictedStdDev: float -> float
val predictedStdDev: float
val min: e1: 'T -> e2: 'T -> 'T (requires comparison)
val inverseStdDevNoLeverageLimit: predictedStdDev: float -> float
val weightExampleLineChart: weightFun: (float -> #IConvertible) -> name: string -> GenericChart.GenericChart
val weightFun: (float -> #IConvertible)
val name: string
val sd: float
val combinedWeightChart: GenericChart.GenericChart
val getManaged: weightFun: (float -> float) -> days: DaysWithTrailing list -> VolPosition list
val weightFun: (float -> float)
val days: DaysWithTrailing list
val day: DaysWithTrailing
val rescaleToVol: desiredVol: float -> xs: VolPosition seq -> VolPosition list
 Rescale to desired SD for
 more interpretable graphs.
 Does not affect sharpe ratio
val desiredVol: float
val xs: VolPosition seq
val accVolPortReturn: port: List<VolPosition> -> (DateTime * float) list
val port: List<VolPosition>
val ret: float
val buyHoldMktPort: VolPosition list
val managedMktPort: VolPosition list
val managedMktPortNoLimit: VolPosition list
val portChart: name: string -> port: (#IConvertible * #IConvertible) seq -> GenericChart.GenericChart
val port: (#IConvertible * #IConvertible) seq
static member Chart.withYAxis: yAxis: LayoutObjects.LinearAxis * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Id: StyleParam.SubPlotId -> (GenericChart.GenericChart -> GenericChart.GenericChart)
namespace Plotly.NET.LayoutObjects
Multiple items
type LinearAxis = inherit DynamicObj new: unit -> LinearAxis static member init: [<Optional; DefaultParameterValue ((null :> obj))>] ?Visible: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?Title: Title * [<Optional; DefaultParameterValue ((null :> obj))>] ?AxisType: AxisType * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoTypeNumbers: AutoTypeNumbers * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoRange: AutoRange * [<Optional; DefaultParameterValue ((null :> obj))>] ?RangeMode: RangeMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?Range: Range * [<Optional; DefaultParameterValue ((null :> obj))>] ?FixedRange: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ScaleAnchor: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?ScaleRatio: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Constrain: AxisConstraint * [<Optional; DefaultParameterValue ((null :> obj))>] ?ConstrainToward: AxisConstraintDirection * [<Optional; DefaultParameterValue ((null :> obj))>] ?Matches: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Rangebreaks: Rangebreak seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickMode: TickMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?NTicks: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Tick0: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?DTick: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickVals: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickText: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Ticks: TickOptions * [<Optional; DefaultParameterValue ((null :> obj))>] ?TicksOn: CategoryTickAnchor * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLabelMode: TickLabelMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLabelPosition: TickLabelPosition * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLabelOverflow: TickLabelOverflow * [<Optional; DefaultParameterValue ((null :> obj))>] ?Mirror: Mirror * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLen: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickLabels: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoMargin: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowSpikes: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeThickness: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeDash: DrawingStyle * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeMode: SpikeMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeSnap: SpikeSnap * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFont: Font * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickAngle: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickPrefix: ShowTickOption * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickPrefix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickSuffix: ShowTickOption * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickSuffix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowExponent: ShowExponent * [<Optional; DefaultParameterValue ((null :> obj))>] ?ExponentFormat: ExponentFormat * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinExponent: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?SeparateThousands: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFormat: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFormatStops: TickFormatStop seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?HoverFormat: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowGrid: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?GridColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?GridWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZeroLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZeroLineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZeroLineWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowDividers: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?DividerColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?DividerWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Anchor: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Side: Side * [<Optional; DefaultParameterValue ((null :> obj))>] ?Overlaying: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Layer: Layer * [<Optional; DefaultParameterValue ((null :> obj))>] ?Domain: Range * [<Optional; DefaultParameterValue ((null :> obj))>] ?Position: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?CategoryOrder: CategoryOrder * [<Optional; DefaultParameterValue ((null :> obj))>] ?CategoryArray: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?UIRevision: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?RangeSlider: RangeSlider * [<Optional; DefaultParameterValue ((null :> obj))>] ?RangeSelector: RangeSelector * [<Optional; DefaultParameterValue ((null :> obj))>] ?Calendar: Calendar * [<Optional; DefaultParameterValue ((null :> obj))>] ?BackgroundColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowBackground: bool -> LinearAxis static member initCarpet: [<Optional; DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?Title: Title * [<Optional; DefaultParameterValue ((null :> obj))>] ?AxisType: AxisType * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoTypeNumbers: AutoTypeNumbers * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoRange: AutoRange * [<Optional; DefaultParameterValue ((null :> obj))>] ?RangeMode: RangeMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?Range: Range * [<Optional; DefaultParameterValue ((null :> obj))>] ?FixedRange: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickMode: TickMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?NTicks: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Tick0: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?DTick: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickVals: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickText: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Ticks: TickOptions * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickLabels: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFont: Font * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickAngle: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickPrefix: ShowTickOption * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickPrefix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickSuffix: ShowTickOption * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickSuffix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowExponent: ShowExponent * [<Optional; DefaultParameterValue ((null :> obj))>] ?ExponentFormat: ExponentFormat * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinExponent: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?SeparateThousands: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFormat: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFormatStops: TickFormatStop seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowGrid: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?GridColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?GridWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?CategoryOrder: CategoryOrder * [<Optional; DefaultParameterValue ((null :> obj))>] ?CategoryArray: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?ArrayDTick: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?ArrayTick0: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?CheaterType: CheaterType * [<Optional; DefaultParameterValue ((null :> obj))>] ?EndLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?EndLineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?EndLineWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?LabelPadding: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?LabelPrefix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?LabelSuffix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinorGridColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinorGridCount: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinorGridWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Smoothing: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?StartLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?StartLineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?StartLineWidth: int -> LinearAxis static member initCategorical: categoryOrder: CategoryOrder * [<Optional; DefaultParameterValue ((null :> obj))>] ?Visible: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?Title: Title * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoTypeNumbers: AutoTypeNumbers * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoRange: AutoRange * [<Optional; DefaultParameterValue ((null :> obj))>] ?RangeMode: RangeMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?Range: Range * [<Optional; DefaultParameterValue ((null :> obj))>] ?FixedRange: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ScaleAnchor: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?ScaleRatio: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Constrain: AxisConstraint * [<Optional; DefaultParameterValue ((null :> obj))>] ?ConstrainToward: AxisConstraintDirection * [<Optional; DefaultParameterValue ((null :> obj))>] ?Matches: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Rangebreaks: Rangebreak seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickMode: TickMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?NTicks: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Tick0: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?DTick: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickVals: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickText: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Ticks: TickOptions * [<Optional; DefaultParameterValue ((null :> obj))>] ?TicksOn: CategoryTickAnchor * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLabelMode: TickLabelMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLabelPosition: TickLabelPosition * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLabelOverflow: TickLabelOverflow * [<Optional; DefaultParameterValue ((null :> obj))>] ?Mirror: Mirror * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLen: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickLabels: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoMargin: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowSpikes: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeThickness: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeDash: DrawingStyle * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeMode: SpikeMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeSnap: SpikeSnap * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFont: Font * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickAngle: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickPrefix: ShowTickOption * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickPrefix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickSuffix: ShowTickOption * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickSuffix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowExponent: ShowExponent * [<Optional; DefaultParameterValue ((null :> obj))>] ?ExponentFormat: ExponentFormat * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinExponent: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?SeparateThousands: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFormat: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFormatStops: TickFormatStop seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?HoverFormat: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowGrid: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?GridColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?GridWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZeroLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZeroLineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZeroLineWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowDividers: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?DividerColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?DividerWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Anchor: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Side: Side * [<Optional; DefaultParameterValue ((null :> obj))>] ?Overlaying: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Layer: Layer * [<Optional; DefaultParameterValue ((null :> obj))>] ?Domain: Range * [<Optional; DefaultParameterValue ((null :> obj))>] ?Position: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?CategoryArray: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?UIRevision: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?RangeSlider: RangeSlider * [<Optional; DefaultParameterValue ((null :> obj))>] ?RangeSelector: RangeSelector * [<Optional; DefaultParameterValue ((null :> obj))>] ?Calendar: Calendar -> LinearAxis static member initIndicatorGauge: [<Optional; DefaultParameterValue ((null :> obj))>] ?DTick: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?ExponentFormat: ExponentFormat * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinExponent: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?NTicks: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Range: Range * [<Optional; DefaultParameterValue ((null :> obj))>] ?SeparateThousands: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowExponent: ShowExponent * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickLabels: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickPrefix: ShowTickOption * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickSuffix: ShowTickOption * [<Optional; DefaultParameterValue ((null :> obj))>] ?Tick0: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickAngle: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFont: Font * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFormat: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFormatStops: TickFormatStop seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLen: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickMode: TickMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickPrefix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?Ticks: TickOptions * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickSuffix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickText: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickVals: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Visible: bool -> LinearAxis static member style: [<Optional; DefaultParameterValue ((null :> obj))>] ?Visible: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?Title: Title * [<Optional; DefaultParameterValue ((null :> obj))>] ?AxisType: AxisType * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoTypeNumbers: AutoTypeNumbers * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoRange: AutoRange * [<Optional; DefaultParameterValue ((null :> obj))>] ?RangeMode: RangeMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?Range: Range * [<Optional; DefaultParameterValue ((null :> obj))>] ?FixedRange: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ScaleAnchor: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?ScaleRatio: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?Constrain: AxisConstraint * [<Optional; DefaultParameterValue ((null :> obj))>] ?ConstrainToward: AxisConstraintDirection * [<Optional; DefaultParameterValue ((null :> obj))>] ?Matches: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Rangebreaks: Rangebreak seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickMode: TickMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?NTicks: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Tick0: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?DTick: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickVals: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickText: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?Ticks: TickOptions * [<Optional; DefaultParameterValue ((null :> obj))>] ?TicksOn: CategoryTickAnchor * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLabelMode: TickLabelMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLabelPosition: TickLabelPosition * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLabelOverflow: TickLabelOverflow * [<Optional; DefaultParameterValue ((null :> obj))>] ?Mirror: Mirror * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickLen: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickLabels: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?AutoMargin: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowSpikes: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeThickness: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeDash: DrawingStyle * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeMode: SpikeMode * [<Optional; DefaultParameterValue ((null :> obj))>] ?SpikeSnap: SpikeSnap * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFont: Font * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickAngle: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickPrefix: ShowTickOption * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickPrefix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowTickSuffix: ShowTickOption * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickSuffix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowExponent: ShowExponent * [<Optional; DefaultParameterValue ((null :> obj))>] ?ExponentFormat: ExponentFormat * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinExponent: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?SeparateThousands: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFormat: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?TickFormatStops: TickFormatStop seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?HoverFormat: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?LineWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowGrid: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?GridColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?GridWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZeroLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZeroLineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ZeroLineWidth: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowDividers: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?DividerColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?DividerWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Anchor: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Side: Side * [<Optional; DefaultParameterValue ((null :> obj))>] ?Overlaying: LinearAxisId * [<Optional; DefaultParameterValue ((null :> obj))>] ?Layer: Layer * [<Optional; DefaultParameterValue ((null :> obj))>] ?Domain: Range * [<Optional; DefaultParameterValue ((null :> obj))>] ?Position: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?CategoryOrder: CategoryOrder * [<Optional; DefaultParameterValue ((null :> obj))>] ?CategoryArray: #IConvertible seq * [<Optional; DefaultParameterValue ((null :> obj))>] ?UIRevision: #IConvertible * [<Optional; DefaultParameterValue ((null :> obj))>] ?RangeSlider: RangeSlider * [<Optional; DefaultParameterValue ((null :> obj))>] ?RangeSelector: RangeSelector * [<Optional; DefaultParameterValue ((null :> obj))>] ?Calendar: Calendar * [<Optional; DefaultParameterValue ((null :> obj))>] ?ArrayDTick: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?ArrayTick0: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?CheaterType: CheaterType * [<Optional; DefaultParameterValue ((null :> obj))>] ?EndLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?EndLineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?EndLineWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?LabelPadding: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?LabelPrefix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?LabelSuffix: string * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinorGridColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinorGridCount: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?MinorGridWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?Smoothing: float * [<Optional; DefaultParameterValue ((null :> obj))>] ?StartLine: bool * [<Optional; DefaultParameterValue ((null :> obj))>] ?StartLineColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?StartLineWidth: int * [<Optional; DefaultParameterValue ((null :> obj))>] ?BackgroundColor: Color * [<Optional; DefaultParameterValue ((null :> obj))>] ?ShowBackground: bool -> (LinearAxis -> LinearAxis)
<summary>Linear axes can be used as x and y scales on 2D plots, and as x,y, and z scales on 3D plots.</summary>

--------------------
new: unit -> LayoutObjects.LinearAxis
static member LayoutObjects.LinearAxis.init: [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Visible: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Color: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Title: Title * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?AxisType: StyleParam.AxisType * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?AutoTypeNumbers: StyleParam.AutoTypeNumbers * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?AutoRange: StyleParam.AutoRange * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?RangeMode: StyleParam.RangeMode * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Range: StyleParam.Range * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?FixedRange: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ScaleAnchor: StyleParam.LinearAxisId * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ScaleRatio: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Constrain: StyleParam.AxisConstraint * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ConstrainToward: StyleParam.AxisConstraintDirection * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Matches: StyleParam.LinearAxisId * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Rangebreaks: LayoutObjects.Rangebreak seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickMode: StyleParam.TickMode * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?NTicks: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Tick0: #IConvertible * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?DTick: #IConvertible * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickVals: #IConvertible seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickText: #IConvertible seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Ticks: StyleParam.TickOptions * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TicksOn: StyleParam.CategoryTickAnchor * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickLabelMode: StyleParam.TickLabelMode * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickLabelPosition: StyleParam.TickLabelPosition * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickLabelOverflow: StyleParam.TickLabelOverflow * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Mirror: StyleParam.Mirror * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickLen: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickWidth: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowTickLabels: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?AutoMargin: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowSpikes: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SpikeColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SpikeThickness: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SpikeDash: StyleParam.DrawingStyle * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SpikeMode: StyleParam.SpikeMode * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SpikeSnap: StyleParam.SpikeSnap * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickFont: Font * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickAngle: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowTickPrefix: StyleParam.ShowTickOption * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickPrefix: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowTickSuffix: StyleParam.ShowTickOption * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickSuffix: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowExponent: StyleParam.ShowExponent * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ExponentFormat: StyleParam.ExponentFormat * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?MinExponent: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?SeparateThousands: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickFormat: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?TickFormatStops: TickFormatStop seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?HoverFormat: string * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowLine: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?LineWidth: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowGrid: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?GridColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?GridWidth: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ZeroLine: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ZeroLineColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ZeroLineWidth: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowDividers: bool * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?DividerColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?DividerWidth: int * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Anchor: StyleParam.LinearAxisId * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Side: StyleParam.Side * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Overlaying: StyleParam.LinearAxisId * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Layer: StyleParam.Layer * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Domain: StyleParam.Range * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Position: float * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CategoryOrder: StyleParam.CategoryOrder * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?CategoryArray: #IConvertible seq * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?UIRevision: #IConvertible * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?RangeSlider: LayoutObjects.RangeSlider * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?RangeSelector: LayoutObjects.RangeSelector * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?Calendar: StyleParam.Calendar * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?BackgroundColor: Color * [<Runtime.InteropServices.Optional; Runtime.InteropServices.DefaultParameterValue ((null :> obj))>] ?ShowBackground: bool -> LayoutObjects.LinearAxis
module StyleParam from Plotly.NET
type AxisType = | Auto | Linear | Log | Date | Category | MultiCategory member Convert: unit -> obj override ToString: unit -> string static member convert: (AxisType -> obj) static member toString: (AxisType -> string)
<summary> Sets the axis type. By default (Auto), plotly attempts to determined the axis type by looking into the data of the traces that referenced the axis in question. </summary>
union case StyleParam.AxisType.Log: StyleParam.AxisType
val bhVsManagedChart: GenericChart.GenericChart
val summarisePortfolio: portfolio: VolPosition list * name: string -> unit
val portfolio: VolPosition list
val mu: float
val round: digits: int -> x: float -> float
<summary> Rounds a double-precision floating-point value to a specified number of fractional digits. </summary>
val printfn: format: Printf.TextWriterFormat<'T> -> 'T
val listOfAllPortfolios: (VolPosition list * string) list
val port: VolPosition list * string

Type something to start searching.