Safe Haskell | None |
---|---|
Language | Haskell2010 |
Synopsis
- parseTermAtom :: Parser TermAtom
- parseVisibleChar :: Parser TermAtom
- parseControl :: Parser TermAtom
- singleCharacterFunction :: Char -> Maybe SingleCharacterFunction
- parseEscape :: Parser TermAtom
- data ControlSequenceIntroducerInput = ControlSequenceIntroducerInput !Text
- data ControlSequenceIntroducerComponents = ControlSequenceIntroducerComponents !Bool !(NonEmpty Int) !Char
- parseControlSequenceIntroducer :: Parser ControlSequenceIntroducerInput
- parseControlSequenceIntroducerComponents :: ControlSequenceIntroducerInput -> Maybe ControlSequenceIntroducerComponents
- listToNonEmpty :: a -> [a] -> NonEmpty a
- processControlSequenceIntroducerComponents :: ControlSequenceIntroducerComponents -> Maybe ControlSequenceIntroducer
- changeZero :: Int -> Int -> Int
- headChangeZero :: Int -> NonEmpty Int -> Int
- parseCsi :: Char -> NonEmpty Int -> Maybe ControlSequenceIntroducer
- parsePrivCsi :: Char -> NonEmpty Int -> Maybe ControlSequenceIntroducer
- processControlSequenceIntroducer :: ControlSequenceIntroducerInput -> Maybe ControlSequenceIntroducer
- processOtherControlSequenceIntroducer :: ControlSequenceIntroducerInput -> Maybe ControlSequenceIntroducer
- renderCsi :: ControlSequenceIntroducerInput -> Text
- data OperatingSystemCommandInput = OperatingSystemCommandInput !Text
- parseOperatingSystemCommand :: Parser OperatingSystemCommandInput
- renderOsc :: OperatingSystemCommandInput -> Text
- processOperatingSystemCommand :: OperatingSystemCommandInput -> Maybe OperatingSystemCommand
- singleCharacterEscapeSequence :: Char -> Maybe EscapeSequence
- between :: Ord a => a -> (a, a) -> Bool
- isControlC0 :: Char -> Bool
- isControlC1 :: Char -> Bool
- isControl :: Char -> Bool
Documentation
parseControl :: Parser TermAtom Source #
This parser always succeeds
parseEscape :: Parser TermAtom Source #
This parser always succeeds
parseControlSequenceIntroducer :: Parser ControlSequenceIntroducerInput Source #
Should be run after reading the sequence ESC [
This parser always succeeds
parseControlSequenceIntroducerComponents :: ControlSequenceIntroducerInput -> Maybe ControlSequenceIntroducerComponents Source #
listToNonEmpty :: a -> [a] -> NonEmpty a Source #
processControlSequenceIntroducerComponents :: ControlSequenceIntroducerComponents -> Maybe ControlSequenceIntroducer Source #
parsePrivCsi :: Char -> NonEmpty Int -> Maybe ControlSequenceIntroducer Source #
processControlSequenceIntroducer :: ControlSequenceIntroducerInput -> Maybe ControlSequenceIntroducer Source #
processOtherControlSequenceIntroducer :: ControlSequenceIntroducerInput -> Maybe ControlSequenceIntroducer Source #
renderCsi :: ControlSequenceIntroducerInput -> Text Source #
Used for error reporting
parseOperatingSystemCommand :: Parser OperatingSystemCommandInput Source #
Should be run after reading the sequence ESC ]
This parser always succeeds
renderOsc :: OperatingSystemCommandInput -> Text Source #
Used for error reporting
processOperatingSystemCommand :: OperatingSystemCommandInput -> Maybe OperatingSystemCommand Source #
isControlC0 :: Char -> Bool Source #
isControlC1 :: Char -> Bool Source #