Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Synopsis
- data PresentationSettings = PresentationSettings {
- psRows :: !(Maybe (FlexibleNum Int))
- psColumns :: !(Maybe (FlexibleNum Int))
- psMargins :: !(Maybe MarginSettings)
- psWrap :: !(Maybe Wrap)
- psTabStop :: !(Maybe (FlexibleNum Int))
- psTheme :: !(Maybe Theme)
- psIncrementalLists :: !(Maybe Bool)
- psAutoAdvanceDelay :: !(Maybe (FlexibleNum Int))
- psSlideLevel :: !(Maybe Int)
- psPandocExtensions :: !(Maybe ExtensionList)
- psImages :: !(Maybe ImageSettings)
- psBreadcrumbs :: !(Maybe Bool)
- psEval :: !(Maybe EvalSettingsMap)
- psSlideNumber :: !(Maybe Bool)
- psSyntaxDefinitions :: !(Maybe [FilePath])
- psSpeakerNotes :: !(Maybe SpeakerNotesSettings)
- psTransition :: !(Maybe TransitionSettings)
- defaultPresentationSettings :: PresentationSettings
- data VarGen
- data Var
- zeroVarGen :: VarGen
- data Presentation = Presentation {
- pFilePath :: !FilePath
- pEncodingFallback :: !EncodingFallback
- pTitle :: ![Inline]
- pAuthor :: ![Inline]
- pSettings :: !PresentationSettings
- pSlides :: !(Seq Slide)
- pBreadcrumbs :: !(Seq Breadcrumbs)
- pSlideSettings :: !(Seq PresentationSettings)
- pTransitionGens :: !(Seq (Maybe TransitionGen))
- pActiveFragment :: !Index
- pSyntaxMap :: !SyntaxMap
- pEvalBlocks :: !EvalBlocks
- pVarGen :: !VarGen
- pVars :: !(HashMap Var [Block])
- readPresentation :: VarGen -> FilePath -> IO (Either String Presentation)
- activeSpeakerNotes :: Presentation -> SpeakerNotes
- activeVars :: Presentation -> HashSet Var
- data Size
- getPresentationSize :: Presentation -> IO Size
- data Display
- displayPresentation :: Size -> Presentation -> Display
- displayPresentationError :: Size -> Presentation -> String -> Doc
- dumpPresentation :: Presentation -> IO ()
- data PresentationCommand
- = Exit
- | Forward
- | Backward
- | SkipForward
- | SkipBackward
- | First
- | Last
- | Reload
- | Seek Int
- | UpdateVar Var [Block]
- | UnknownCommand String
- readPresentationCommand :: Handle -> IO PresentationCommand
- data UpdatedPresentation
- updatePresentation :: PresentationCommand -> Presentation -> IO UpdatedPresentation
Documentation
data PresentationSettings Source #
These are patat-specific settings. That is where they differ from more general metadata (author, title...)
PresentationSettings | |
|
Instances
FromJSON PresentationSettings Source # | |
Defined in Patat.Presentation.Settings | |
Monoid PresentationSettings Source # | |
Semigroup PresentationSettings Source # | |
Defined in Patat.Presentation.Settings | |
Show PresentationSettings Source # | |
Defined in Patat.Presentation.Settings showsPrec :: Int -> PresentationSettings -> ShowS # show :: PresentationSettings -> String # showList :: [PresentationSettings] -> ShowS # |
Used to generate fresh variables.
A variable is like a placeholder in the instructions, something we don't know yet, dynamic content. Currently this is only used for code evaluation.
zeroVarGen :: VarGen Source #
data Presentation Source #
Presentation | |
|
readPresentation :: VarGen -> FilePath -> IO (Either String Presentation) Source #
activeVars :: Presentation -> HashSet Var Source #
getPresentationSize :: Presentation -> IO Size Source #
displayPresentation :: Size -> Presentation -> Display Source #
displayPresentationError :: Size -> Presentation -> String -> Doc Source #
Displays an error in the place of the presentation. This is useful if we want to display an error but keep the presentation running.
dumpPresentation :: Presentation -> IO () Source #
data PresentationCommand Source #
Exit | |
Forward | |
Backward | |
SkipForward | |
SkipBackward | |
First | |
Last | |
Reload | |
Seek Int | |
UpdateVar Var [Block] | |
UnknownCommand String |
Instances
Show PresentationCommand Source # | |
Defined in Patat.Presentation.Interactive showsPrec :: Int -> PresentationCommand -> ShowS # show :: PresentationCommand -> String # showList :: [PresentationCommand] -> ShowS # | |
Eq PresentationCommand Source # | |
Defined in Patat.Presentation.Interactive (==) :: PresentationCommand -> PresentationCommand -> Bool # (/=) :: PresentationCommand -> PresentationCommand -> Bool # |
data UpdatedPresentation Source #