Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- data SConfig = SConfig {}
- repSConfig :: Monad m => SConfig -> SharedRep m SConfig
- totalFrames :: SConfig -> Int
- defaultSConfig :: SConfig
- run :: SConfig -> IO ()
- defaultAnimation :: SConfig -> Animation
- circle_ :: Double -> Point Double
- circle :: Animation
- scale_ :: Double -> Point Double -> Point Double
- circles :: SConfig -> Animation
- serveSend :: SConfig -> Animation -> IO ()
- data Animation = Animation {
- freeze :: Double -> (HudOptions, [Chart Double])
- frameStamp :: Animation
- cleanHud :: Rect Double -> [Chart Double]
- stdHud :: Rect Double -> Animation
- square :: Point (Double -> Double -> Double) -> SConfig -> Animation
- line :: Point (Double -> Double -> Double) -> SConfig -> Animation
- chartEmitter :: SConfig -> Animation -> Cont IO (Emitter IO Text)
- outputText :: Animation -> Double -> Text
- carousel :: SConfig -> Cont IO (Emitter IO Double)
- delaylist :: [Double] -> [a] -> Cont IO (Emitter IO a)
- delay :: Emitter IO Double -> Emitter IO a -> Emitter IO a
- chartPage :: Page
- bodyPage :: Page
Documentation
Instances
Eq SConfig Source # | |
Show SConfig Source # | |
Generic SConfig Source # | |
type Rep SConfig Source # | |
Defined in Chart.Serve type Rep SConfig = D1 (MetaData "SConfig" "Chart.Serve" "chart-svg-various-0.0.2-2sl6jPGUZ3cAlqdIWNMYzm" False) (C1 (MetaCons "SConfig" PrefixI True) ((S1 (MetaSel (Just "framerate") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Double) :*: S1 (MetaSel (Just "runtime") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Double)) :*: (S1 (MetaSel (Just "s1") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Double) :*: (S1 (MetaSel (Just "s2") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Double) :*: S1 (MetaSel (Just "numglyphs") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int))))) |
totalFrames :: SConfig -> Int Source #
defaultAnimation :: SConfig -> Animation Source #
serveSend :: SConfig -> Animation -> IO () Source #
serveSend (defaultSConfig & #frameRate .~ 1000) frameStamp
frameStamp :: Animation Source #
charts