| Safe Haskell | Safe |
|---|---|
| Language | Haskell2010 |
Cryptol.Parser.Token
Synopsis
- data Token = Token {}
- data TokenV
- data TokenW
- data TokenKW
- = KW_else
- | KW_fin
- | KW_if
- | KW_case
- | KW_of
- | KW_private
- | KW_include
- | KW_inf
- | KW_lg2
- | KW_lengthFromThen
- | KW_lengthFromThenTo
- | KW_max
- | KW_min
- | KW_module
- | KW_submodule
- | KW_newtype
- | KW_enum
- | KW_pragma
- | KW_property
- | KW_then
- | KW_type
- | KW_where
- | KW_let
- | KW_x
- | KW_import
- | KW_as
- | KW_hiding
- | KW_infixl
- | KW_infixr
- | KW_infix
- | KW_primitive
- | KW_parameter
- | KW_constraint
- | KW_interface
- | KW_foreign
- | KW_Prop
- | KW_by
- | KW_down
- data TokenOp
- data TokenSym
- data TokenErr
- data SelectorType
- data TokenT
Documentation
Instances
| Generic Token Source # | |
| Show Token Source # | |
| PP Token Source # | |
| NFData Token Source # | |
Defined in Cryptol.Parser.Token | |
| type Rep Token Source # | |
Defined in Cryptol.Parser.Token type Rep Token = D1 ('MetaData "Token" "Cryptol.Parser.Token" "cryptol-3.3.0-7OIQa8lMv7L2xoAlM9JEI6" 'False) (C1 ('MetaCons "Token" 'PrefixI 'True) (S1 ('MetaSel ('Just "tokenType") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TokenT) :*: S1 ('MetaSel ('Just "tokenText") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))) | |
Virtual tokens, inserted by layout processing.
Instances
| Generic TokenV Source # | |
| Show TokenV Source # | |
| NFData TokenV Source # | |
Defined in Cryptol.Parser.Token | |
| Eq TokenV Source # | |
| type Rep TokenV Source # | |
Defined in Cryptol.Parser.Token type Rep TokenV = D1 ('MetaData "TokenV" "Cryptol.Parser.Token" "cryptol-3.3.0-7OIQa8lMv7L2xoAlM9JEI6" 'False) (C1 ('MetaCons "VCurlyL" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "VCurlyR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "VSemi" 'PrefixI 'False) (U1 :: Type -> Type))) | |
Constructors
| BlockComment | |
| LineComment | |
| Space | |
| DocStr |
Instances
| Generic TokenW Source # | |
| Show TokenW Source # | |
| NFData TokenW Source # | |
Defined in Cryptol.Parser.Token | |
| Eq TokenW Source # | |
| type Rep TokenW Source # | |
Defined in Cryptol.Parser.Token type Rep TokenW = D1 ('MetaData "TokenW" "Cryptol.Parser.Token" "cryptol-3.3.0-7OIQa8lMv7L2xoAlM9JEI6" 'False) ((C1 ('MetaCons "BlockComment" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LineComment" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Space" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "DocStr" 'PrefixI 'False) (U1 :: Type -> Type))) | |
Constructors
Instances
The named operators are a special case for parsing types, and Other is
used for all other cases that lexed as an operator.
Instances
Constructors
| Bar | |
| ArrL | |
| ArrR | |
| FatArrR | |
| Lambda | |
| EqDef | |
| Comma | |
| Semi | |
| Dot | |
| DotDot | |
| DotDotDot | |
| DotDotLt | |
| DotDotGt | |
| Colon | |
| BackTick | |
| ParenL | |
| ParenR | |
| BracketL | |
| BracketR | |
| CurlyL | |
| CurlyR | |
| TriL | |
| TriR | |
| Lt | |
| Gt | |
| Underscore |
Instances
Constructors
| UnterminatedComment | |
| UnterminatedString | |
| UnterminatedChar | |
| InvalidString | |
| InvalidChar | |
| LexicalError | |
| MalformedLiteral | |
| MalformedSelector | |
| InvalidIndentation TokenT |
Instances
data SelectorType Source #
Constructors
| RecordSelectorTok Text | |
| TupleSelectorTok Int |
Instances
| Generic SelectorType Source # | |
Defined in Cryptol.Parser.Token Associated Types type Rep SelectorType :: Type -> Type # | |
| Show SelectorType Source # | |
Defined in Cryptol.Parser.Token Methods showsPrec :: Int -> SelectorType -> ShowS # show :: SelectorType -> String # showList :: [SelectorType] -> ShowS # | |
| NFData SelectorType Source # | |
Defined in Cryptol.Parser.Token Methods rnf :: SelectorType -> () # | |
| Eq SelectorType Source # | |
Defined in Cryptol.Parser.Token | |
| type Rep SelectorType Source # | |
Defined in Cryptol.Parser.Token type Rep SelectorType = D1 ('MetaData "SelectorType" "Cryptol.Parser.Token" "cryptol-3.3.0-7OIQa8lMv7L2xoAlM9JEI6" 'False) (C1 ('MetaCons "RecordSelectorTok" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :+: C1 ('MetaCons "TupleSelectorTok" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int))) | |
Constructors
| Num !Integer !Int !Int | value, base, number of digits |
| Frac !Rational !Int | value, base. |
| ChrLit !Char | character literal |
| Ident ![Text] !Text | (qualified) identifier |
| StrLit !String | string literal |
| Selector !SelectorType | .hello or .123 |
| KW !TokenKW | keyword |
| Op !TokenOp | operator |
| Sym !TokenSym | symbol |
| Virt !TokenV | virtual token (for layout) |
| White !TokenW | white space token |
| Err !TokenErr | error token |
| EOF |