Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
runAlexSt :: ByteString -> Alex a -> Either String (AlexUserState, a) Source #
withAlexSt :: ByteString -> AlexUserState -> Alex a -> Either String (AlexUserState, a) Source #
Instances
Eq AlexPosn Source # | |
Ord AlexPosn Source # | |
Defined in Kempe.Lexer | |
Show AlexPosn Source # | |
Generic AlexPosn Source # | |
NFData AlexPosn Source # | |
Defined in Kempe.Lexer | |
Pretty AlexPosn Source # | |
Defined in Kempe.Lexer | |
type Rep AlexPosn Source # | |
Defined in Kempe.Lexer type Rep AlexPosn = D1 ('MetaData "AlexPosn" "Kempe.Lexer" "kempe-0.2.0.2-7aFdeCc8E8gKOrV08w2EMP-kempe-modules" 'False) (C1 ('MetaCons "AlexPn" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Int)))) |
EOF | |
| |
TokSym | |
TokName | |
TokTyName | |
TokKeyword | |
TokInt | |
TokInt8 | |
TokWord | |
TokForeign | |
| |
TokModuleStr | |
| |
TokBuiltin | |
Instances
Generic Keyword Source # | |
NFData Keyword Source # | |
Defined in Kempe.Lexer | |
Pretty Keyword Source # | |
Defined in Kempe.Lexer | |
type Rep Keyword Source # | |
Defined in Kempe.Lexer type Rep Keyword = D1 ('MetaData "Keyword" "Kempe.Lexer" "kempe-0.2.0.2-7aFdeCc8E8gKOrV08w2EMP-kempe-modules" 'False) (((C1 ('MetaCons "KwType" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "KwImport" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "KwCase" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "KwCfun" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "KwIf" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "KwForeign" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "KwCabi" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "KwKabi" 'PrefixI 'False) (U1 :: Type -> Type)))) |
Instances
BuiltinBool | |
BuiltinBoolLit | |
BuiltinInt | |
BuiltinInt8 | |
BuiltinWord | |
BuiltinDip | |
BuiltinDrop | |
BuiltinSwap | |
BuiltinDup | |
BuiltinIntXor | |
BuiltinWordXor | |
BuiltinBoolXor | |
BuiltinPopcount |
Instances
Generic Builtin Source # | |
NFData Builtin Source # | |
Defined in Kempe.Lexer | |
Pretty Builtin Source # | |
Defined in Kempe.Lexer | |
type Rep Builtin Source # | |
Defined in Kempe.Lexer type Rep Builtin = D1 ('MetaData "Builtin" "Kempe.Lexer" "kempe-0.2.0.2-7aFdeCc8E8gKOrV08w2EMP-kempe-modules" 'False) (((C1 ('MetaCons "BuiltinBool" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "BuiltinBoolLit" 'PrefixI 'True) (S1 ('MetaSel ('Just "bool") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Bool)) :+: C1 ('MetaCons "BuiltinInt" 'PrefixI 'False) (U1 :: Type -> Type))) :+: (C1 ('MetaCons "BuiltinInt8" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "BuiltinWord" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BuiltinDip" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "BuiltinDrop" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "BuiltinSwap" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BuiltinDup" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "BuiltinIntXor" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BuiltinWordXor" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "BuiltinBoolXor" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "BuiltinPopcount" 'PrefixI 'False) (U1 :: Type -> Type))))) |