purescript-0.15.14: PureScript Programming Language Compiler
Safe HaskellSafe-Inferred
LanguageHaskell2010

Language.PureScript.CST.Errors

Documentation

data ParserErrorInfo a Source #

Instances

Instances details
Generic (ParserErrorInfo a) Source # 
Instance details

Defined in Language.PureScript.CST.Errors

Associated Types

type Rep (ParserErrorInfo a) :: Type -> Type #

Show a => Show (ParserErrorInfo a) Source # 
Instance details

Defined in Language.PureScript.CST.Errors

NFData a => NFData (ParserErrorInfo a) Source # 
Instance details

Defined in Language.PureScript.CST.Errors

Methods

rnf :: ParserErrorInfo a -> () #

Eq a => Eq (ParserErrorInfo a) Source # 
Instance details

Defined in Language.PureScript.CST.Errors

type Rep (ParserErrorInfo a) Source # 
Instance details

Defined in Language.PureScript.CST.Errors

type Rep (ParserErrorInfo a) = D1 ('MetaData "ParserErrorInfo" "Language.PureScript.CST.Errors" "purescript-0.15.14-JcflwnDm1Hv5HxS5CV5TJ2" 'False) (C1 ('MetaCons "ParserErrorInfo" 'PrefixI 'True) ((S1 ('MetaSel ('Just "errRange") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceRange) :*: S1 ('MetaSel ('Just "errToks") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [SourceToken])) :*: (S1 ('MetaSel ('Just "errStack") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LayoutStack) :*: S1 ('MetaSel ('Just "errType") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))))

data ParserErrorType Source #

Instances

Instances details
Generic ParserErrorType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

Associated Types

type Rep ParserErrorType :: Type -> Type #

Show ParserErrorType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

NFData ParserErrorType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

Methods

rnf :: ParserErrorType -> () #

Eq ParserErrorType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

Ord ParserErrorType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

type Rep ParserErrorType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

type Rep ParserErrorType = D1 ('MetaData "ParserErrorType" "Language.PureScript.CST.Errors" "purescript-0.15.14-JcflwnDm1Hv5HxS5CV5TJ2" 'False) (((((C1 ('MetaCons "ErrWildcardInType" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrConstraintInKind" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ErrHoleInType" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrExprInBinder" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ErrExprInDeclOrBinder" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrExprInDecl" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ErrBinderInDecl" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ErrRecordUpdateInCtr" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrRecordPunInUpdate" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "ErrRecordCtrInUpdate" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrTypeInConstraint" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ErrElseInDecl" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrInstanceNameMismatch" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ErrUnknownFundep" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrImportInDecl" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ErrGuardInLetBinder" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ErrKeywordVar" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrKeywordSymbol" 'PrefixI 'False) (U1 :: Type -> Type)))))) :+: ((((C1 ('MetaCons "ErrQuotedPun" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrToken" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ErrLineFeedInString" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrAstralCodePointInChar" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "ErrCharEscape" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrNumberOutOfRange" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ErrLeadingZero" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ErrExpectedFraction" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrExpectedExponent" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: (((C1 ('MetaCons "ErrExpectedHex" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrReservedSymbol" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ErrCharInGap" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Char)) :+: (C1 ('MetaCons "ErrModuleName" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrQualifiedName" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: ((C1 ('MetaCons "ErrEmptyDo" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrLexeme" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe String)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [String]))) :+: (C1 ('MetaCons "ErrConstraintInForeignImportSyntax" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "ErrEof" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "ErrCustom" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String))))))))

data ParserWarningType Source #

Instances

Instances details
Generic ParserWarningType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

Associated Types

type Rep ParserWarningType :: Type -> Type #

Show ParserWarningType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

NFData ParserWarningType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

Methods

rnf :: ParserWarningType -> () #

Eq ParserWarningType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

Ord ParserWarningType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

type Rep ParserWarningType Source # 
Instance details

Defined in Language.PureScript.CST.Errors

type Rep ParserWarningType = D1 ('MetaData "ParserWarningType" "Language.PureScript.CST.Errors" "purescript-0.15.14-JcflwnDm1Hv5HxS5CV5TJ2" 'False) ((C1 ('MetaCons "WarnDeprecatedRowSyntax" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WarnDeprecatedForeignKindSyntax" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "WarnDeprecatedKindImportSyntax" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "WarnDeprecatedKindExportSyntax" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WarnDeprecatedCaseOfOffsideSyntax" 'PrefixI 'False) (U1 :: Type -> Type))))