Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data Ex = Ex {
- excss :: SvgOptions
- exhc :: HudOptions
- exmaxcs :: Int
- exanns :: [Annotation]
- exxys :: [[XY Double]]
- makeExample :: HudOptions -> [Chart Double] -> Ex
- repEx :: Monad m => Ex -> SharedRep m (Text, Text)
- writeChartExample :: FilePath -> Ex -> IO ()
- memptyExample :: Ex
- unitExample :: Ex
- hudExample :: Ex
- rectExample :: Ex
- rss :: [[Rect Double]]
- ropts :: [RectStyle]
- lineExample :: Ex
- ls :: [[Point Double]]
- lopts :: [LineStyle]
- legopts :: LegendOptions
- exampleLineHudOptions :: Text -> Maybe Text -> Maybe (LegendOptions, [(Annotation, Text)]) -> HudOptions
- textExample :: Ex
- glyphExample :: Ex
- glyphs :: [Chart Double]
- barDataExample :: BarData
- barExample :: Ex
- pixelEx :: ([Chart Double], [Hud Double])
- f1 :: TrigField a => Point a -> a
- boundTextBug :: [Chart Double]
- gopts3 :: [GlyphStyle]
- glines :: [Chart Double]
- lgdata :: [(Text, Point Double)]
- lglyph :: [Chart Double]
- labelExample :: Ex
- placedLabel :: Real a => Point a -> a -> Text -> Chart a
- label :: [Chart Double]
- legendTest :: HudOptions
- mainExample :: Ex
- writeAllExamples :: IO ()
Documentation
Ex | |
|
Instances
Eq Ex Source # | |
Show Ex Source # | |
Generic Ex Source # | |
type Rep Ex Source # | |
Defined in Chart.Examples type Rep Ex = D1 (MetaData "Ex" "Chart.Examples" "chart-svg-0.1.2-K89SSSElHsJhPN2grvNgz" False) (C1 (MetaCons "Ex" PrefixI True) ((S1 (MetaSel (Just "excss") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 SvgOptions) :*: S1 (MetaSel (Just "exhc") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 HudOptions)) :*: (S1 (MetaSel (Just "exmaxcs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int) :*: (S1 (MetaSel (Just "exanns") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [Annotation]) :*: S1 (MetaSel (Just "exxys") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 [[XY Double]]))))) |
makeExample :: HudOptions -> [Chart Double] -> Ex Source #
memptyExample :: Ex Source #
minimal example
unitExample :: Ex Source #
unit example
hudExample :: Ex Source #
hud example
rectExample :: Ex Source #
rect example
lineExample :: Ex Source #
line example
exampleLineHudOptions :: Text -> Maybe Text -> Maybe (LegendOptions, [(Annotation, Text)]) -> HudOptions Source #
textExample :: Ex Source #
text example
glyphExample :: Ex Source #
glyph example
barDataExample :: BarData Source #
bar example
barExample :: Ex Source #
stuff
boundTextBug :: [Chart Double] Source #
gopts3 :: [GlyphStyle] Source #
compound chart
labelExample :: Ex Source #
label example
legendTest :: HudOptions Source #
legend test
mainExample :: Ex Source #
main example
writeAllExamples :: IO () Source #