purescript-0.15.15: PureScript Programming Language Compiler
Safe HaskellNone
LanguageHaskell2010

Language.PureScript.CST.Types

Description

This module contains data types for the entire PureScript surface language. Every token is represented in the tree, and every token is annotated with whitespace and comments (both leading and trailing). This means one can write an exact printer so that `print . parse = id`. Every constructor is laid out with tokens in left-to-right order. The core productions are given a slot for arbitrary annotations, however this is not used by the parser.

Documentation

data SourcePos #

Constructors

SourcePos 

Fields

Instances

Instances details
NFData SourcePos # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

rnf :: SourcePos -> () #

Generic SourcePos # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep SourcePos 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourcePos = D1 ('MetaData "SourcePos" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "SourcePos" 'PrefixI 'True) (S1 ('MetaSel ('Just "srcLine") 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 Int) :*: S1 ('MetaSel ('Just "srcColumn") 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 Int)))
Show SourcePos # 
Instance details

Defined in Language.PureScript.CST.Types

Eq SourcePos # 
Instance details

Defined in Language.PureScript.CST.Types

Ord SourcePos # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourcePos # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourcePos = D1 ('MetaData "SourcePos" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "SourcePos" 'PrefixI 'True) (S1 ('MetaSel ('Just "srcLine") 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 Int) :*: S1 ('MetaSel ('Just "srcColumn") 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 Int)))

data SourceRange #

Constructors

SourceRange 

Instances

Instances details
NFData SourceRange # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

rnf :: SourceRange -> () #

Generic SourceRange # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep SourceRange 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourceRange = D1 ('MetaData "SourceRange" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "SourceRange" 'PrefixI 'True) (S1 ('MetaSel ('Just "srcStart") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourcePos) :*: S1 ('MetaSel ('Just "srcEnd") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourcePos)))
Show SourceRange # 
Instance details

Defined in Language.PureScript.CST.Types

Eq SourceRange # 
Instance details

Defined in Language.PureScript.CST.Types

Ord SourceRange # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourceRange # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourceRange = D1 ('MetaData "SourceRange" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "SourceRange" 'PrefixI 'True) (S1 ('MetaSel ('Just "srcStart") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourcePos) :*: S1 ('MetaSel ('Just "srcEnd") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourcePos)))

data Comment l #

Constructors

Comment !Text 
Space !Int 
Line !l 

Instances

Instances details
Functor Comment # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Comment a -> Comment b #

(<$) :: a -> Comment b -> Comment a #

NFData l => NFData (Comment l) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

rnf :: Comment l -> () #

Generic (Comment l) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Comment l) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Comment l) = D1 ('MetaData "Comment" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Comment" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: (C1 ('MetaCons "Space" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 Int)) :+: C1 ('MetaCons "Line" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 l))))

Methods

from :: Comment l -> Rep (Comment l) x #

to :: Rep (Comment l) x -> Comment l #

Show l => Show (Comment l) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Comment l -> ShowS #

show :: Comment l -> String #

showList :: [Comment l] -> ShowS #

Eq l => Eq (Comment l) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Comment l -> Comment l -> Bool #

(/=) :: Comment l -> Comment l -> Bool #

Ord l => Ord (Comment l) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Comment l -> Comment l -> Ordering #

(<) :: Comment l -> Comment l -> Bool #

(<=) :: Comment l -> Comment l -> Bool #

(>) :: Comment l -> Comment l -> Bool #

(>=) :: Comment l -> Comment l -> Bool #

max :: Comment l -> Comment l -> Comment l #

min :: Comment l -> Comment l -> Comment l #

type Rep (Comment l) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Comment l) = D1 ('MetaData "Comment" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Comment" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: (C1 ('MetaCons "Space" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'SourceUnpack 'SourceStrict 'DecidedStrict) (Rec0 Int)) :+: C1 ('MetaCons "Line" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 l))))

data LineFeed #

Constructors

LF 
CRLF 

Instances

Instances details
NFData LineFeed # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

rnf :: LineFeed -> () #

Generic LineFeed # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep LineFeed 
Instance details

Defined in Language.PureScript.CST.Types

type Rep LineFeed = D1 ('MetaData "LineFeed" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "LF" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CRLF" 'PrefixI 'False) (U1 :: Type -> Type))

Methods

from :: LineFeed -> Rep LineFeed x #

to :: Rep LineFeed x -> LineFeed #

Show LineFeed # 
Instance details

Defined in Language.PureScript.CST.Types

Eq LineFeed # 
Instance details

Defined in Language.PureScript.CST.Types

Ord LineFeed # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep LineFeed # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep LineFeed = D1 ('MetaData "LineFeed" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "LF" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "CRLF" 'PrefixI 'False) (U1 :: Type -> Type))

data TokenAnn #

Instances

Instances details
NFData TokenAnn # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

rnf :: TokenAnn -> () #

Generic TokenAnn # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep TokenAnn 
Instance details

Defined in Language.PureScript.CST.Types

type Rep TokenAnn = D1 ('MetaData "TokenAnn" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "TokenAnn" 'PrefixI 'True) (S1 ('MetaSel ('Just "tokRange") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceRange) :*: (S1 ('MetaSel ('Just "tokLeadingComments") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Comment LineFeed]) :*: S1 ('MetaSel ('Just "tokTrailingComments") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Comment Void]))))

Methods

from :: TokenAnn -> Rep TokenAnn x #

to :: Rep TokenAnn x -> TokenAnn #

Show TokenAnn # 
Instance details

Defined in Language.PureScript.CST.Types

Eq TokenAnn # 
Instance details

Defined in Language.PureScript.CST.Types

Ord TokenAnn # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep TokenAnn # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep TokenAnn = D1 ('MetaData "TokenAnn" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "TokenAnn" 'PrefixI 'True) (S1 ('MetaSel ('Just "tokRange") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceRange) :*: (S1 ('MetaSel ('Just "tokLeadingComments") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Comment LineFeed]) :*: S1 ('MetaSel ('Just "tokTrailingComments") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Comment Void]))))

data SourceStyle #

Constructors

ASCII 
Unicode 

Instances

Instances details
NFData SourceStyle # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

rnf :: SourceStyle -> () #

Generic SourceStyle # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep SourceStyle 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourceStyle = D1 ('MetaData "SourceStyle" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "ASCII" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Unicode" 'PrefixI 'False) (U1 :: Type -> Type))
Show SourceStyle # 
Instance details

Defined in Language.PureScript.CST.Types

Eq SourceStyle # 
Instance details

Defined in Language.PureScript.CST.Types

Ord SourceStyle # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourceStyle # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourceStyle = D1 ('MetaData "SourceStyle" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "ASCII" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Unicode" 'PrefixI 'False) (U1 :: Type -> Type))

data Token #

Instances

Instances details
NFData Token # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

rnf :: Token -> () #

Generic Token # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep Token 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Token = D1 ('MetaData "Token" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (((((C1 ('MetaCons "TokLeftParen" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokRightParen" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TokLeftBrace" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokRightBrace" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "TokLeftSquare" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokRightSquare" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TokLeftArrow" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle)) :+: C1 ('MetaCons "TokRightArrow" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle))))) :+: (((C1 ('MetaCons "TokRightFatArrow" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle)) :+: C1 ('MetaCons "TokDoubleColon" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle))) :+: (C1 ('MetaCons "TokForall" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle)) :+: C1 ('MetaCons "TokEquals" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "TokPipe" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokTick" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TokDot" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokComma" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: ((((C1 ('MetaCons "TokUnderscore" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokBackslash" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TokLowerName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Text]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "TokUpperName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Text]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)))) :+: ((C1 ('MetaCons "TokOperator" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Text]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "TokSymbolName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Text]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))) :+: (C1 ('MetaCons "TokSymbolArr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle)) :+: C1 ('MetaCons "TokHole" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))) :+: (((C1 ('MetaCons "TokChar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Char)) :+: C1 ('MetaCons "TokString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PSString))) :+: (C1 ('MetaCons "TokRawString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "TokInt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer)))) :+: ((C1 ('MetaCons "TokNumber" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Double)) :+: C1 ('MetaCons "TokLayoutStart" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TokLayoutSep" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TokLayoutEnd" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokEof" 'PrefixI 'False) (U1 :: Type -> Type)))))))

Methods

from :: Token -> Rep Token x #

to :: Rep Token x -> Token #

Show Token # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Token -> ShowS #

show :: Token -> String #

showList :: [Token] -> ShowS #

Eq Token # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Token -> Token -> Bool #

(/=) :: Token -> Token -> Bool #

Ord Token # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Token -> Token -> Ordering #

(<) :: Token -> Token -> Bool #

(<=) :: Token -> Token -> Bool #

(>) :: Token -> Token -> Bool #

(>=) :: Token -> Token -> Bool #

max :: Token -> Token -> Token #

min :: Token -> Token -> Token #

type Rep Token # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Token = D1 ('MetaData "Token" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (((((C1 ('MetaCons "TokLeftParen" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokRightParen" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TokLeftBrace" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokRightBrace" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "TokLeftSquare" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokRightSquare" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TokLeftArrow" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle)) :+: C1 ('MetaCons "TokRightArrow" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle))))) :+: (((C1 ('MetaCons "TokRightFatArrow" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle)) :+: C1 ('MetaCons "TokDoubleColon" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle))) :+: (C1 ('MetaCons "TokForall" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle)) :+: C1 ('MetaCons "TokEquals" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "TokPipe" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokTick" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TokDot" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokComma" 'PrefixI 'False) (U1 :: Type -> Type))))) :+: ((((C1 ('MetaCons "TokUnderscore" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokBackslash" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TokLowerName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Text]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "TokUpperName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Text]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)))) :+: ((C1 ('MetaCons "TokOperator" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Text]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "TokSymbolName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 [Text]) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))) :+: (C1 ('MetaCons "TokSymbolArr" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 SourceStyle)) :+: C1 ('MetaCons "TokHole" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text))))) :+: (((C1 ('MetaCons "TokChar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Char)) :+: C1 ('MetaCons "TokString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 PSString))) :+: (C1 ('MetaCons "TokRawString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text)) :+: C1 ('MetaCons "TokInt" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Integer)))) :+: ((C1 ('MetaCons "TokNumber" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Text) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Double)) :+: C1 ('MetaCons "TokLayoutStart" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "TokLayoutSep" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "TokLayoutEnd" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "TokEof" 'PrefixI 'False) (U1 :: Type -> Type)))))))

data SourceToken #

Constructors

SourceToken 

Fields

Instances

Instances details
NFData SourceToken # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

rnf :: SourceToken -> () #

Generic SourceToken # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep SourceToken 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourceToken = D1 ('MetaData "SourceToken" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "SourceToken" 'PrefixI 'True) (S1 ('MetaSel ('Just "tokAnn") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TokenAnn) :*: S1 ('MetaSel ('Just "tokValue") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Token)))
Show SourceToken # 
Instance details

Defined in Language.PureScript.CST.Types

Eq SourceToken # 
Instance details

Defined in Language.PureScript.CST.Types

Ord SourceToken # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourceToken # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep SourceToken = D1 ('MetaData "SourceToken" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "SourceToken" 'PrefixI 'True) (S1 ('MetaSel ('Just "tokAnn") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 TokenAnn) :*: S1 ('MetaSel ('Just "tokValue") 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 Token)))

data Ident #

Constructors

Ident 

Fields

Instances

Instances details
Generic Ident # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep Ident 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Ident = D1 ('MetaData "Ident" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Ident" 'PrefixI 'True) (S1 ('MetaSel ('Just "getIdent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

Methods

from :: Ident -> Rep Ident x #

to :: Rep Ident x -> Ident #

Show Ident # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Ident -> ShowS #

show :: Ident -> String #

showList :: [Ident] -> ShowS #

Eq Ident # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Ident -> Ident -> Bool #

(/=) :: Ident -> Ident -> Bool #

Ord Ident # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Ident -> Ident -> Ordering #

(<) :: Ident -> Ident -> Bool #

(<=) :: Ident -> Ident -> Bool #

(>) :: Ident -> Ident -> Bool #

(>=) :: Ident -> Ident -> Bool #

max :: Ident -> Ident -> Ident #

min :: Ident -> Ident -> Ident #

type Rep Ident # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Ident = D1 ('MetaData "Ident" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Ident" 'PrefixI 'True) (S1 ('MetaSel ('Just "getIdent") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data Name a #

Constructors

Name 

Fields

Instances

Instances details
Functor Name # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Name a -> Name b #

(<$) :: a -> Name b -> Name a #

Foldable Name # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Name m -> m #

foldMap :: Monoid m => (a -> m) -> Name a -> m #

foldMap' :: Monoid m => (a -> m) -> Name a -> m #

foldr :: (a -> b -> b) -> b -> Name a -> b #

foldr' :: (a -> b -> b) -> b -> Name a -> b #

foldl :: (b -> a -> b) -> b -> Name a -> b #

foldl' :: (b -> a -> b) -> b -> Name a -> b #

foldr1 :: (a -> a -> a) -> Name a -> a #

foldl1 :: (a -> a -> a) -> Name a -> a #

toList :: Name a -> [a] #

null :: Name a -> Bool #

length :: Name a -> Int #

elem :: Eq a => a -> Name a -> Bool #

maximum :: Ord a => Name a -> a #

minimum :: Ord a => Name a -> a #

sum :: Num a => Name a -> a #

product :: Num a => Name a -> a #

Traversable Name # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Name a -> f (Name b) #

sequenceA :: Applicative f => Name (f a) -> f (Name a) #

mapM :: Monad m => (a -> m b) -> Name a -> m (Name b) #

sequence :: Monad m => Name (m a) -> m (Name a) #

Generic (Name a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Name a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Name a) = D1 ('MetaData "Name" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Name" 'PrefixI 'True) (S1 ('MetaSel ('Just "nameTok") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "nameValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

Methods

from :: Name a -> Rep (Name a) x #

to :: Rep (Name a) x -> Name a #

Show a => Show (Name a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Name a -> ShowS #

show :: Name a -> String #

showList :: [Name a] -> ShowS #

Eq a => Eq (Name a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Name a -> Name a -> Bool #

(/=) :: Name a -> Name a -> Bool #

Ord a => Ord (Name a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Name a -> Name a -> Ordering #

(<) :: Name a -> Name a -> Bool #

(<=) :: Name a -> Name a -> Bool #

(>) :: Name a -> Name a -> Bool #

(>=) :: Name a -> Name a -> Bool #

max :: Name a -> Name a -> Name a #

min :: Name a -> Name a -> Name a #

type Rep (Name a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Name a) = D1 ('MetaData "Name" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Name" 'PrefixI 'True) (S1 ('MetaSel ('Just "nameTok") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "nameValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)))

data QualifiedName a #

Instances

Instances details
Functor QualifiedName # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> QualifiedName a -> QualifiedName b #

(<$) :: a -> QualifiedName b -> QualifiedName a #

Foldable QualifiedName # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => QualifiedName m -> m #

foldMap :: Monoid m => (a -> m) -> QualifiedName a -> m #

foldMap' :: Monoid m => (a -> m) -> QualifiedName a -> m #

foldr :: (a -> b -> b) -> b -> QualifiedName a -> b #

foldr' :: (a -> b -> b) -> b -> QualifiedName a -> b #

foldl :: (b -> a -> b) -> b -> QualifiedName a -> b #

foldl' :: (b -> a -> b) -> b -> QualifiedName a -> b #

foldr1 :: (a -> a -> a) -> QualifiedName a -> a #

foldl1 :: (a -> a -> a) -> QualifiedName a -> a #

toList :: QualifiedName a -> [a] #

null :: QualifiedName a -> Bool #

length :: QualifiedName a -> Int #

elem :: Eq a => a -> QualifiedName a -> Bool #

maximum :: Ord a => QualifiedName a -> a #

minimum :: Ord a => QualifiedName a -> a #

sum :: Num a => QualifiedName a -> a #

product :: Num a => QualifiedName a -> a #

Traversable QualifiedName # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> QualifiedName a -> f (QualifiedName b) #

sequenceA :: Applicative f => QualifiedName (f a) -> f (QualifiedName a) #

mapM :: Monad m => (a -> m b) -> QualifiedName a -> m (QualifiedName b) #

sequence :: Monad m => QualifiedName (m a) -> m (QualifiedName a) #

Generic (QualifiedName a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (QualifiedName a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (QualifiedName a) = D1 ('MetaData "QualifiedName" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "QualifiedName" 'PrefixI 'True) (S1 ('MetaSel ('Just "qualTok") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: (S1 ('MetaSel ('Just "qualModule") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ModuleName)) :*: S1 ('MetaSel ('Just "qualName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))))
Show a => Show (QualifiedName a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (QualifiedName a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (QualifiedName a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (QualifiedName a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (QualifiedName a) = D1 ('MetaData "QualifiedName" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "QualifiedName" 'PrefixI 'True) (S1 ('MetaSel ('Just "qualTok") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: (S1 ('MetaSel ('Just "qualModule") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe ModuleName)) :*: S1 ('MetaSel ('Just "qualName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))))

data Label #

Constructors

Label 

Instances

Instances details
Generic Label # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep Label 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Label = D1 ('MetaData "Label" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Label" 'PrefixI 'True) (S1 ('MetaSel ('Just "lblTok") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "lblName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PSString)))

Methods

from :: Label -> Rep Label x #

to :: Rep Label x -> Label #

Show Label # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Label -> ShowS #

show :: Label -> String #

showList :: [Label] -> ShowS #

Eq Label # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Label -> Label -> Bool #

(/=) :: Label -> Label -> Bool #

Ord Label # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Label -> Label -> Ordering #

(<) :: Label -> Label -> Bool #

(<=) :: Label -> Label -> Bool #

(>) :: Label -> Label -> Bool #

(>=) :: Label -> Label -> Bool #

max :: Label -> Label -> Label #

min :: Label -> Label -> Label #

type Rep Label # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Label = D1 ('MetaData "Label" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Label" 'PrefixI 'True) (S1 ('MetaSel ('Just "lblTok") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "lblName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PSString)))

data Wrapped a #

Constructors

Wrapped 

Instances

Instances details
Functor Wrapped # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Wrapped a -> Wrapped b #

(<$) :: a -> Wrapped b -> Wrapped a #

Foldable Wrapped # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Wrapped m -> m #

foldMap :: Monoid m => (a -> m) -> Wrapped a -> m #

foldMap' :: Monoid m => (a -> m) -> Wrapped a -> m #

foldr :: (a -> b -> b) -> b -> Wrapped a -> b #

foldr' :: (a -> b -> b) -> b -> Wrapped a -> b #

foldl :: (b -> a -> b) -> b -> Wrapped a -> b #

foldl' :: (b -> a -> b) -> b -> Wrapped a -> b #

foldr1 :: (a -> a -> a) -> Wrapped a -> a #

foldl1 :: (a -> a -> a) -> Wrapped a -> a #

toList :: Wrapped a -> [a] #

null :: Wrapped a -> Bool #

length :: Wrapped a -> Int #

elem :: Eq a => a -> Wrapped a -> Bool #

maximum :: Ord a => Wrapped a -> a #

minimum :: Ord a => Wrapped a -> a #

sum :: Num a => Wrapped a -> a #

product :: Num a => Wrapped a -> a #

Traversable Wrapped # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Wrapped a -> f (Wrapped b) #

sequenceA :: Applicative f => Wrapped (f a) -> f (Wrapped a) #

mapM :: Monad m => (a -> m b) -> Wrapped a -> m (Wrapped b) #

sequence :: Monad m => Wrapped (m a) -> m (Wrapped a) #

Generic (Wrapped a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Wrapped a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Wrapped a) = D1 ('MetaData "Wrapped" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Wrapped" 'PrefixI 'True) (S1 ('MetaSel ('Just "wrpOpen") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: (S1 ('MetaSel ('Just "wrpValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "wrpClose") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken))))

Methods

from :: Wrapped a -> Rep (Wrapped a) x #

to :: Rep (Wrapped a) x -> Wrapped a #

Show a => Show (Wrapped a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Wrapped a -> ShowS #

show :: Wrapped a -> String #

showList :: [Wrapped a] -> ShowS #

Eq a => Eq (Wrapped a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Wrapped a -> Wrapped a -> Bool #

(/=) :: Wrapped a -> Wrapped a -> Bool #

Ord a => Ord (Wrapped a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Wrapped a -> Wrapped a -> Ordering #

(<) :: Wrapped a -> Wrapped a -> Bool #

(<=) :: Wrapped a -> Wrapped a -> Bool #

(>) :: Wrapped a -> Wrapped a -> Bool #

(>=) :: Wrapped a -> Wrapped a -> Bool #

max :: Wrapped a -> Wrapped a -> Wrapped a #

min :: Wrapped a -> Wrapped a -> Wrapped a #

type Rep (Wrapped a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Wrapped a) = D1 ('MetaData "Wrapped" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Wrapped" 'PrefixI 'True) (S1 ('MetaSel ('Just "wrpOpen") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: (S1 ('MetaSel ('Just "wrpValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "wrpClose") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken))))

data Separated a #

Constructors

Separated 

Fields

Instances

Instances details
Functor Separated # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Separated a -> Separated b #

(<$) :: a -> Separated b -> Separated a #

Foldable Separated # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Separated m -> m #

foldMap :: Monoid m => (a -> m) -> Separated a -> m #

foldMap' :: Monoid m => (a -> m) -> Separated a -> m #

foldr :: (a -> b -> b) -> b -> Separated a -> b #

foldr' :: (a -> b -> b) -> b -> Separated a -> b #

foldl :: (b -> a -> b) -> b -> Separated a -> b #

foldl' :: (b -> a -> b) -> b -> Separated a -> b #

foldr1 :: (a -> a -> a) -> Separated a -> a #

foldl1 :: (a -> a -> a) -> Separated a -> a #

toList :: Separated a -> [a] #

null :: Separated a -> Bool #

length :: Separated a -> Int #

elem :: Eq a => a -> Separated a -> Bool #

maximum :: Ord a => Separated a -> a #

minimum :: Ord a => Separated a -> a #

sum :: Num a => Separated a -> a #

product :: Num a => Separated a -> a #

Traversable Separated # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Separated a -> f (Separated b) #

sequenceA :: Applicative f => Separated (f a) -> f (Separated a) #

mapM :: Monad m => (a -> m b) -> Separated a -> m (Separated b) #

sequence :: Monad m => Separated (m a) -> m (Separated a) #

Generic (Separated a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Separated a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Separated a) = D1 ('MetaData "Separated" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Separated" 'PrefixI 'True) (S1 ('MetaSel ('Just "sepHead") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "sepTail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SourceToken, a)])))

Methods

from :: Separated a -> Rep (Separated a) x #

to :: Rep (Separated a) x -> Separated a #

Show a => Show (Separated a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (Separated a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Separated a -> Separated a -> Bool #

(/=) :: Separated a -> Separated a -> Bool #

Ord a => Ord (Separated a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Separated a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Separated a) = D1 ('MetaData "Separated" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Separated" 'PrefixI 'True) (S1 ('MetaSel ('Just "sepHead") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Just "sepTail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [(SourceToken, a)])))

data Labeled a b #

Constructors

Labeled 

Fields

Instances

Instances details
Functor (Labeled a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a0 -> b) -> Labeled a a0 -> Labeled a b #

(<$) :: a0 -> Labeled a b -> Labeled a a0 #

Foldable (Labeled a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Labeled a m -> m #

foldMap :: Monoid m => (a0 -> m) -> Labeled a a0 -> m #

foldMap' :: Monoid m => (a0 -> m) -> Labeled a a0 -> m #

foldr :: (a0 -> b -> b) -> b -> Labeled a a0 -> b #

foldr' :: (a0 -> b -> b) -> b -> Labeled a a0 -> b #

foldl :: (b -> a0 -> b) -> b -> Labeled a a0 -> b #

foldl' :: (b -> a0 -> b) -> b -> Labeled a a0 -> b #

foldr1 :: (a0 -> a0 -> a0) -> Labeled a a0 -> a0 #

foldl1 :: (a0 -> a0 -> a0) -> Labeled a a0 -> a0 #

toList :: Labeled a a0 -> [a0] #

null :: Labeled a a0 -> Bool #

length :: Labeled a a0 -> Int #

elem :: Eq a0 => a0 -> Labeled a a0 -> Bool #

maximum :: Ord a0 => Labeled a a0 -> a0 #

minimum :: Ord a0 => Labeled a a0 -> a0 #

sum :: Num a0 => Labeled a a0 -> a0 #

product :: Num a0 => Labeled a a0 -> a0 #

Traversable (Labeled a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a0 -> f b) -> Labeled a a0 -> f (Labeled a b) #

sequenceA :: Applicative f => Labeled a (f a0) -> f (Labeled a a0) #

mapM :: Monad m => (a0 -> m b) -> Labeled a a0 -> m (Labeled a b) #

sequence :: Monad m => Labeled a (m a0) -> m (Labeled a a0) #

Generic (Labeled a b) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Labeled a b) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Labeled a b) = D1 ('MetaData "Labeled" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Labeled" 'PrefixI 'True) (S1 ('MetaSel ('Just "lblLabel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "lblSep") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "lblValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b))))

Methods

from :: Labeled a b -> Rep (Labeled a b) x #

to :: Rep (Labeled a b) x -> Labeled a b #

(Show a, Show b) => Show (Labeled a b) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Labeled a b -> ShowS #

show :: Labeled a b -> String #

showList :: [Labeled a b] -> ShowS #

(Eq a, Eq b) => Eq (Labeled a b) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Labeled a b -> Labeled a b -> Bool #

(/=) :: Labeled a b -> Labeled a b -> Bool #

(Ord a, Ord b) => Ord (Labeled a b) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Labeled a b -> Labeled a b -> Ordering #

(<) :: Labeled a b -> Labeled a b -> Bool #

(<=) :: Labeled a b -> Labeled a b -> Bool #

(>) :: Labeled a b -> Labeled a b -> Bool #

(>=) :: Labeled a b -> Labeled a b -> Bool #

max :: Labeled a b -> Labeled a b -> Labeled a b #

min :: Labeled a b -> Labeled a b -> Labeled a b #

type Rep (Labeled a b) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Labeled a b) = D1 ('MetaData "Labeled" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Labeled" 'PrefixI 'True) (S1 ('MetaSel ('Just "lblLabel") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "lblSep") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "lblValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 b))))

data OneOrDelimited a #

Constructors

One a 
Many (DelimitedNonEmpty a) 

Instances

Instances details
Functor OneOrDelimited # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> OneOrDelimited a -> OneOrDelimited b #

(<$) :: a -> OneOrDelimited b -> OneOrDelimited a #

Foldable OneOrDelimited # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => OneOrDelimited m -> m #

foldMap :: Monoid m => (a -> m) -> OneOrDelimited a -> m #

foldMap' :: Monoid m => (a -> m) -> OneOrDelimited a -> m #

foldr :: (a -> b -> b) -> b -> OneOrDelimited a -> b #

foldr' :: (a -> b -> b) -> b -> OneOrDelimited a -> b #

foldl :: (b -> a -> b) -> b -> OneOrDelimited a -> b #

foldl' :: (b -> a -> b) -> b -> OneOrDelimited a -> b #

foldr1 :: (a -> a -> a) -> OneOrDelimited a -> a #

foldl1 :: (a -> a -> a) -> OneOrDelimited a -> a #

toList :: OneOrDelimited a -> [a] #

null :: OneOrDelimited a -> Bool #

length :: OneOrDelimited a -> Int #

elem :: Eq a => a -> OneOrDelimited a -> Bool #

maximum :: Ord a => OneOrDelimited a -> a #

minimum :: Ord a => OneOrDelimited a -> a #

sum :: Num a => OneOrDelimited a -> a #

product :: Num a => OneOrDelimited a -> a #

Traversable OneOrDelimited # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> OneOrDelimited a -> f (OneOrDelimited b) #

sequenceA :: Applicative f => OneOrDelimited (f a) -> f (OneOrDelimited a) #

mapM :: Monad m => (a -> m b) -> OneOrDelimited a -> m (OneOrDelimited b) #

sequence :: Monad m => OneOrDelimited (m a) -> m (OneOrDelimited a) #

Generic (OneOrDelimited a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (OneOrDelimited a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (OneOrDelimited a) = D1 ('MetaData "OneOrDelimited" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "One" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Many" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DelimitedNonEmpty a))))
Show a => Show (OneOrDelimited a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (OneOrDelimited a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (OneOrDelimited a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (OneOrDelimited a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (OneOrDelimited a) = D1 ('MetaData "OneOrDelimited" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "One" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a)) :+: C1 ('MetaCons "Many" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DelimitedNonEmpty a))))

data Type a #

Instances

Instances details
Functor Type # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Type a -> Type b #

(<$) :: a -> Type b -> Type a #

Foldable Type # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Type m -> m #

foldMap :: Monoid m => (a -> m) -> Type a -> m #

foldMap' :: Monoid m => (a -> m) -> Type a -> m #

foldr :: (a -> b -> b) -> b -> Type a -> b #

foldr' :: (a -> b -> b) -> b -> Type a -> b #

foldl :: (b -> a -> b) -> b -> Type a -> b #

foldl' :: (b -> a -> b) -> b -> Type a -> b #

foldr1 :: (a -> a -> a) -> Type a -> a #

foldl1 :: (a -> a -> a) -> Type a -> a #

toList :: Type a -> [a] #

null :: Type a -> Bool #

length :: Type a -> Int #

elem :: Eq a => a -> Type a -> Bool #

maximum :: Ord a => Type a -> a #

minimum :: Ord a => Type a -> a #

sum :: Num a => Type a -> a #

product :: Num a => Type a -> a #

Traversable Type # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Type a -> f (Type b) #

sequenceA :: Applicative f => Type (f a) -> f (Type a) #

mapM :: Monad m => (a -> m b) -> Type a -> m (Type b) #

sequence :: Monad m => Type (m a) -> m (Type a) #

Generic (Type a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Type a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Type a) = D1 ('MetaData "Type" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) ((((C1 ('MetaCons "TypeVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :+: C1 ('MetaCons "TypeConstructor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (ProperName 'TypeName))))) :+: (C1 ('MetaCons "TypeWildcard" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :+: C1 ('MetaCons "TypeHole" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))))) :+: ((C1 ('MetaCons "TypeString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PSString))) :+: C1 ('MetaCons "TypeInt" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SourceToken))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)))) :+: (C1 ('MetaCons "TypeRow" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Row a)))) :+: (C1 ('MetaCons "TypeRecord" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Row a)))) :+: C1 ('MetaCons "TypeForall" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (TypeVarBinding a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))))))) :+: (((C1 ('MetaCons "TypeKinded" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "TypeApp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))) :+: (C1 ('MetaCons "TypeOp" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (OpName 'TypeOpName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "TypeOpName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (OpName 'TypeOpName)))))) :+: ((C1 ('MetaCons "TypeArr" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "TypeArrName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken))) :+: (C1 ('MetaCons "TypeConstrained" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Constraint a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: (C1 ('MetaCons "TypeParens" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Type a)))) :+: C1 ('MetaCons "TypeUnaryRow" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))))))))

Methods

from :: Type a -> Rep (Type a) x #

to :: Rep (Type a) x -> Type a #

Show a => Show (Type a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Type a -> ShowS #

show :: Type a -> String #

showList :: [Type a] -> ShowS #

Eq a => Eq (Type a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Type a -> Type a -> Bool #

(/=) :: Type a -> Type a -> Bool #

Ord a => Ord (Type a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Type a -> Type a -> Ordering #

(<) :: Type a -> Type a -> Bool #

(<=) :: Type a -> Type a -> Bool #

(>) :: Type a -> Type a -> Bool #

(>=) :: Type a -> Type a -> Bool #

max :: Type a -> Type a -> Type a #

min :: Type a -> Type a -> Type a #

type Rep (Type a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Type a) = D1 ('MetaData "Type" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) ((((C1 ('MetaCons "TypeVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :+: C1 ('MetaCons "TypeConstructor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (ProperName 'TypeName))))) :+: (C1 ('MetaCons "TypeWildcard" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :+: C1 ('MetaCons "TypeHole" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))))) :+: ((C1 ('MetaCons "TypeString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PSString))) :+: C1 ('MetaCons "TypeInt" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SourceToken))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Integer)))) :+: (C1 ('MetaCons "TypeRow" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Row a)))) :+: (C1 ('MetaCons "TypeRecord" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Row a)))) :+: C1 ('MetaCons "TypeForall" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (TypeVarBinding a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))))))) :+: (((C1 ('MetaCons "TypeKinded" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "TypeApp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))) :+: (C1 ('MetaCons "TypeOp" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (OpName 'TypeOpName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "TypeOpName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (OpName 'TypeOpName)))))) :+: ((C1 ('MetaCons "TypeArr" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "TypeArrName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken))) :+: (C1 ('MetaCons "TypeConstrained" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Constraint a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: (C1 ('MetaCons "TypeParens" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Type a)))) :+: C1 ('MetaCons "TypeUnaryRow" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))))))))

data TypeVarBinding a #

Instances

Instances details
Functor TypeVarBinding # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> TypeVarBinding a -> TypeVarBinding b #

(<$) :: a -> TypeVarBinding b -> TypeVarBinding a #

Foldable TypeVarBinding # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => TypeVarBinding m -> m #

foldMap :: Monoid m => (a -> m) -> TypeVarBinding a -> m #

foldMap' :: Monoid m => (a -> m) -> TypeVarBinding a -> m #

foldr :: (a -> b -> b) -> b -> TypeVarBinding a -> b #

foldr' :: (a -> b -> b) -> b -> TypeVarBinding a -> b #

foldl :: (b -> a -> b) -> b -> TypeVarBinding a -> b #

foldl' :: (b -> a -> b) -> b -> TypeVarBinding a -> b #

foldr1 :: (a -> a -> a) -> TypeVarBinding a -> a #

foldl1 :: (a -> a -> a) -> TypeVarBinding a -> a #

toList :: TypeVarBinding a -> [a] #

null :: TypeVarBinding a -> Bool #

length :: TypeVarBinding a -> Int #

elem :: Eq a => a -> TypeVarBinding a -> Bool #

maximum :: Ord a => TypeVarBinding a -> a #

minimum :: Ord a => TypeVarBinding a -> a #

sum :: Num a => TypeVarBinding a -> a #

product :: Num a => TypeVarBinding a -> a #

Traversable TypeVarBinding # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> TypeVarBinding a -> f (TypeVarBinding b) #

sequenceA :: Applicative f => TypeVarBinding (f a) -> f (TypeVarBinding a) #

mapM :: Monad m => (a -> m b) -> TypeVarBinding a -> m (TypeVarBinding b) #

sequence :: Monad m => TypeVarBinding (m a) -> m (TypeVarBinding a) #

Generic (TypeVarBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (TypeVarBinding a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (TypeVarBinding a) = D1 ('MetaData "TypeVarBinding" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "TypeVarKinded" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Labeled (Maybe SourceToken, Name Ident) (Type a))))) :+: C1 ('MetaCons "TypeVarName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SourceToken, Name Ident))))
Show a => Show (TypeVarBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (TypeVarBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (TypeVarBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (TypeVarBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (TypeVarBinding a) = D1 ('MetaData "TypeVarBinding" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "TypeVarKinded" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Labeled (Maybe SourceToken, Name Ident) (Type a))))) :+: C1 ('MetaCons "TypeVarName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SourceToken, Name Ident))))

data Constraint a #

Instances

Instances details
Functor Constraint # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Constraint a -> Constraint b #

(<$) :: a -> Constraint b -> Constraint a #

Foldable Constraint # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Constraint m -> m #

foldMap :: Monoid m => (a -> m) -> Constraint a -> m #

foldMap' :: Monoid m => (a -> m) -> Constraint a -> m #

foldr :: (a -> b -> b) -> b -> Constraint a -> b #

foldr' :: (a -> b -> b) -> b -> Constraint a -> b #

foldl :: (b -> a -> b) -> b -> Constraint a -> b #

foldl' :: (b -> a -> b) -> b -> Constraint a -> b #

foldr1 :: (a -> a -> a) -> Constraint a -> a #

foldl1 :: (a -> a -> a) -> Constraint a -> a #

toList :: Constraint a -> [a] #

null :: Constraint a -> Bool #

length :: Constraint a -> Int #

elem :: Eq a => a -> Constraint a -> Bool #

maximum :: Ord a => Constraint a -> a #

minimum :: Ord a => Constraint a -> a #

sum :: Num a => Constraint a -> a #

product :: Num a => Constraint a -> a #

Traversable Constraint # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Constraint a -> f (Constraint b) #

sequenceA :: Applicative f => Constraint (f a) -> f (Constraint a) #

mapM :: Monad m => (a -> m b) -> Constraint a -> m (Constraint b) #

sequence :: Monad m => Constraint (m a) -> m (Constraint a) #

Generic (Constraint a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: Constraint a -> Rep (Constraint a) x #

to :: Rep (Constraint a) x -> Constraint a #

Show a => Show (Constraint a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (Constraint a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Constraint a -> Constraint a -> Bool #

(/=) :: Constraint a -> Constraint a -> Bool #

Ord a => Ord (Constraint a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Constraint a) # 
Instance details

Defined in Language.PureScript.CST.Types

data Row a #

Constructors

Row 

Instances

Instances details
Functor Row # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Row a -> Row b #

(<$) :: a -> Row b -> Row a #

Foldable Row # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Row m -> m #

foldMap :: Monoid m => (a -> m) -> Row a -> m #

foldMap' :: Monoid m => (a -> m) -> Row a -> m #

foldr :: (a -> b -> b) -> b -> Row a -> b #

foldr' :: (a -> b -> b) -> b -> Row a -> b #

foldl :: (b -> a -> b) -> b -> Row a -> b #

foldl' :: (b -> a -> b) -> b -> Row a -> b #

foldr1 :: (a -> a -> a) -> Row a -> a #

foldl1 :: (a -> a -> a) -> Row a -> a #

toList :: Row a -> [a] #

null :: Row a -> Bool #

length :: Row a -> Int #

elem :: Eq a => a -> Row a -> Bool #

maximum :: Ord a => Row a -> a #

minimum :: Ord a => Row a -> a #

sum :: Num a => Row a -> a #

product :: Num a => Row a -> a #

Traversable Row # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Row a -> f (Row b) #

sequenceA :: Applicative f => Row (f a) -> f (Row a) #

mapM :: Monad m => (a -> m b) -> Row a -> m (Row b) #

sequence :: Monad m => Row (m a) -> m (Row a) #

Generic (Row a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Row a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Row a) = D1 ('MetaData "Row" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Row" 'PrefixI 'True) (S1 ('MetaSel ('Just "rowLabels") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Separated (Labeled Label (Type a))))) :*: S1 ('MetaSel ('Just "rowTail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SourceToken, Type a)))))

Methods

from :: Row a -> Rep (Row a) x #

to :: Rep (Row a) x -> Row a #

Show a => Show (Row a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Row a -> ShowS #

show :: Row a -> String #

showList :: [Row a] -> ShowS #

Eq a => Eq (Row a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Row a -> Row a -> Bool #

(/=) :: Row a -> Row a -> Bool #

Ord a => Ord (Row a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Row a -> Row a -> Ordering #

(<) :: Row a -> Row a -> Bool #

(<=) :: Row a -> Row a -> Bool #

(>) :: Row a -> Row a -> Bool #

(>=) :: Row a -> Row a -> Bool #

max :: Row a -> Row a -> Row a #

min :: Row a -> Row a -> Row a #

type Rep (Row a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Row a) = D1 ('MetaData "Row" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Row" 'PrefixI 'True) (S1 ('MetaSel ('Just "rowLabels") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Separated (Labeled Label (Type a))))) :*: S1 ('MetaSel ('Just "rowTail") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SourceToken, Type a)))))

data Module a #

Instances

Instances details
Functor Module # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Module a -> Module b #

(<$) :: a -> Module b -> Module a #

Foldable Module # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Module m -> m #

foldMap :: Monoid m => (a -> m) -> Module a -> m #

foldMap' :: Monoid m => (a -> m) -> Module a -> m #

foldr :: (a -> b -> b) -> b -> Module a -> b #

foldr' :: (a -> b -> b) -> b -> Module a -> b #

foldl :: (b -> a -> b) -> b -> Module a -> b #

foldl' :: (b -> a -> b) -> b -> Module a -> b #

foldr1 :: (a -> a -> a) -> Module a -> a #

foldl1 :: (a -> a -> a) -> Module a -> a #

toList :: Module a -> [a] #

null :: Module a -> Bool #

length :: Module a -> Int #

elem :: Eq a => a -> Module a -> Bool #

maximum :: Ord a => Module a -> a #

minimum :: Ord a => Module a -> a #

sum :: Num a => Module a -> a #

product :: Num a => Module a -> a #

Traversable Module # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Module a -> f (Module b) #

sequenceA :: Applicative f => Module (f a) -> f (Module a) #

mapM :: Monad m => (a -> m b) -> Module a -> m (Module b) #

sequence :: Monad m => Module (m a) -> m (Module a) #

Generic (Module a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: Module a -> Rep (Module a) x #

to :: Rep (Module a) x -> Module a #

Show a => Show (Module a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Module a -> ShowS #

show :: Module a -> String #

showList :: [Module a] -> ShowS #

Eq a => Eq (Module a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Module a -> Module a -> Bool #

(/=) :: Module a -> Module a -> Bool #

Ord a => Ord (Module a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Module a -> Module a -> Ordering #

(<) :: Module a -> Module a -> Bool #

(<=) :: Module a -> Module a -> Bool #

(>) :: Module a -> Module a -> Bool #

(>=) :: Module a -> Module a -> Bool #

max :: Module a -> Module a -> Module a #

min :: Module a -> Module a -> Module a #

type Rep (Module a) # 
Instance details

Defined in Language.PureScript.CST.Types

data Export a #

Instances

Instances details
Functor Export # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Export a -> Export b #

(<$) :: a -> Export b -> Export a #

Foldable Export # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Export m -> m #

foldMap :: Monoid m => (a -> m) -> Export a -> m #

foldMap' :: Monoid m => (a -> m) -> Export a -> m #

foldr :: (a -> b -> b) -> b -> Export a -> b #

foldr' :: (a -> b -> b) -> b -> Export a -> b #

foldl :: (b -> a -> b) -> b -> Export a -> b #

foldl' :: (b -> a -> b) -> b -> Export a -> b #

foldr1 :: (a -> a -> a) -> Export a -> a #

foldl1 :: (a -> a -> a) -> Export a -> a #

toList :: Export a -> [a] #

null :: Export a -> Bool #

length :: Export a -> Int #

elem :: Eq a => a -> Export a -> Bool #

maximum :: Ord a => Export a -> a #

minimum :: Ord a => Export a -> a #

sum :: Num a => Export a -> a #

product :: Num a => Export a -> a #

Traversable Export # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Export a -> f (Export b) #

sequenceA :: Applicative f => Export (f a) -> f (Export a) #

mapM :: Monad m => (a -> m b) -> Export a -> m (Export b) #

sequence :: Monad m => Export (m a) -> m (Export a) #

Generic (Export a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Export a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Export a) = D1 ('MetaData "Export" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) ((C1 ('MetaCons "ExportValue" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :+: (C1 ('MetaCons "ExportOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (OpName 'ValueOpName)))) :+: C1 ('MetaCons "ExportType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'TypeName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (DataMembers a))))))) :+: (C1 ('MetaCons "ExportTypeOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (OpName 'TypeOpName))))) :+: (C1 ('MetaCons "ExportClass" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'ClassName))))) :+: C1 ('MetaCons "ExportModule" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name ModuleName)))))))

Methods

from :: Export a -> Rep (Export a) x #

to :: Rep (Export a) x -> Export a #

Show a => Show (Export a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Export a -> ShowS #

show :: Export a -> String #

showList :: [Export a] -> ShowS #

Eq a => Eq (Export a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Export a -> Export a -> Bool #

(/=) :: Export a -> Export a -> Bool #

Ord a => Ord (Export a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Export a -> Export a -> Ordering #

(<) :: Export a -> Export a -> Bool #

(<=) :: Export a -> Export a -> Bool #

(>) :: Export a -> Export a -> Bool #

(>=) :: Export a -> Export a -> Bool #

max :: Export a -> Export a -> Export a #

min :: Export a -> Export a -> Export a #

type Rep (Export a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Export a) = D1 ('MetaData "Export" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) ((C1 ('MetaCons "ExportValue" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :+: (C1 ('MetaCons "ExportOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (OpName 'ValueOpName)))) :+: C1 ('MetaCons "ExportType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'TypeName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (DataMembers a))))))) :+: (C1 ('MetaCons "ExportTypeOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (OpName 'TypeOpName))))) :+: (C1 ('MetaCons "ExportClass" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'ClassName))))) :+: C1 ('MetaCons "ExportModule" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name ModuleName)))))))

data DataMembers a #

Instances

Instances details
Functor DataMembers # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> DataMembers a -> DataMembers b #

(<$) :: a -> DataMembers b -> DataMembers a #

Foldable DataMembers # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => DataMembers m -> m #

foldMap :: Monoid m => (a -> m) -> DataMembers a -> m #

foldMap' :: Monoid m => (a -> m) -> DataMembers a -> m #

foldr :: (a -> b -> b) -> b -> DataMembers a -> b #

foldr' :: (a -> b -> b) -> b -> DataMembers a -> b #

foldl :: (b -> a -> b) -> b -> DataMembers a -> b #

foldl' :: (b -> a -> b) -> b -> DataMembers a -> b #

foldr1 :: (a -> a -> a) -> DataMembers a -> a #

foldl1 :: (a -> a -> a) -> DataMembers a -> a #

toList :: DataMembers a -> [a] #

null :: DataMembers a -> Bool #

length :: DataMembers a -> Int #

elem :: Eq a => a -> DataMembers a -> Bool #

maximum :: Ord a => DataMembers a -> a #

minimum :: Ord a => DataMembers a -> a #

sum :: Num a => DataMembers a -> a #

product :: Num a => DataMembers a -> a #

Traversable DataMembers # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> DataMembers a -> f (DataMembers b) #

sequenceA :: Applicative f => DataMembers (f a) -> f (DataMembers a) #

mapM :: Monad m => (a -> m b) -> DataMembers a -> m (DataMembers b) #

sequence :: Monad m => DataMembers (m a) -> m (DataMembers a) #

Generic (DataMembers a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: DataMembers a -> Rep (DataMembers a) x #

to :: Rep (DataMembers a) x -> DataMembers a #

Show a => Show (DataMembers a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (DataMembers a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (DataMembers a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (DataMembers a) # 
Instance details

Defined in Language.PureScript.CST.Types

data Declaration a #

Instances

Instances details
Functor Declaration # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Declaration a -> Declaration b #

(<$) :: a -> Declaration b -> Declaration a #

Foldable Declaration # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Declaration m -> m #

foldMap :: Monoid m => (a -> m) -> Declaration a -> m #

foldMap' :: Monoid m => (a -> m) -> Declaration a -> m #

foldr :: (a -> b -> b) -> b -> Declaration a -> b #

foldr' :: (a -> b -> b) -> b -> Declaration a -> b #

foldl :: (b -> a -> b) -> b -> Declaration a -> b #

foldl' :: (b -> a -> b) -> b -> Declaration a -> b #

foldr1 :: (a -> a -> a) -> Declaration a -> a #

foldl1 :: (a -> a -> a) -> Declaration a -> a #

toList :: Declaration a -> [a] #

null :: Declaration a -> Bool #

length :: Declaration a -> Int #

elem :: Eq a => a -> Declaration a -> Bool #

maximum :: Ord a => Declaration a -> a #

minimum :: Ord a => Declaration a -> a #

sum :: Num a => Declaration a -> a #

product :: Num a => Declaration a -> a #

Traversable Declaration # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Declaration a -> f (Declaration b) #

sequenceA :: Applicative f => Declaration (f a) -> f (Declaration a) #

mapM :: Monad m => (a -> m b) -> Declaration a -> m (Declaration b) #

sequence :: Monad m => Declaration (m a) -> m (Declaration a) #

Generic (Declaration a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Declaration a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Declaration a) = D1 ('MetaData "Declaration" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (((C1 ('MetaCons "DeclData" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DataHead a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SourceToken, Separated (DataCtor a)))))) :+: (C1 ('MetaCons "DeclType" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DataHead a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "DeclNewtype" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DataHead a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'ConstructorName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))))) :+: (C1 ('MetaCons "DeclClass" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ClassHead a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SourceToken, NonEmpty (Labeled (Name Ident) (Type a))))))) :+: (C1 ('MetaCons "DeclInstanceChain" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Separated (Instance a)))) :+: C1 ('MetaCons "DeclDerive" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SourceToken)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (InstanceHead a))))))) :+: ((C1 ('MetaCons "DeclKindSignature" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Labeled (Name (ProperName 'TypeName)) (Type a))))) :+: (C1 ('MetaCons "DeclSignature" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Labeled (Name Ident) (Type a)))) :+: C1 ('MetaCons "DeclValue" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ValueBindingFields a))))) :+: (C1 ('MetaCons "DeclFixity" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FixityFields)) :+: (C1 ('MetaCons "DeclForeign" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Foreign a)))) :+: C1 ('MetaCons "DeclRole" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'TypeName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Role)))))))))

Methods

from :: Declaration a -> Rep (Declaration a) x #

to :: Rep (Declaration a) x -> Declaration a #

Show a => Show (Declaration a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (Declaration a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (Declaration a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Declaration a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Declaration a) = D1 ('MetaData "Declaration" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (((C1 ('MetaCons "DeclData" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DataHead a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SourceToken, Separated (DataCtor a)))))) :+: (C1 ('MetaCons "DeclType" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DataHead a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "DeclNewtype" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DataHead a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'ConstructorName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a))))))) :+: (C1 ('MetaCons "DeclClass" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ClassHead a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SourceToken, NonEmpty (Labeled (Name Ident) (Type a))))))) :+: (C1 ('MetaCons "DeclInstanceChain" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Separated (Instance a)))) :+: C1 ('MetaCons "DeclDerive" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SourceToken)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (InstanceHead a))))))) :+: ((C1 ('MetaCons "DeclKindSignature" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Labeled (Name (ProperName 'TypeName)) (Type a))))) :+: (C1 ('MetaCons "DeclSignature" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Labeled (Name Ident) (Type a)))) :+: C1 ('MetaCons "DeclValue" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ValueBindingFields a))))) :+: (C1 ('MetaCons "DeclFixity" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FixityFields)) :+: (C1 ('MetaCons "DeclForeign" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Foreign a)))) :+: C1 ('MetaCons "DeclRole" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'TypeName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty Role)))))))))

data Instance a #

Instances

Instances details
Functor Instance # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Instance a -> Instance b #

(<$) :: a -> Instance b -> Instance a #

Foldable Instance # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Instance m -> m #

foldMap :: Monoid m => (a -> m) -> Instance a -> m #

foldMap' :: Monoid m => (a -> m) -> Instance a -> m #

foldr :: (a -> b -> b) -> b -> Instance a -> b #

foldr' :: (a -> b -> b) -> b -> Instance a -> b #

foldl :: (b -> a -> b) -> b -> Instance a -> b #

foldl' :: (b -> a -> b) -> b -> Instance a -> b #

foldr1 :: (a -> a -> a) -> Instance a -> a #

foldl1 :: (a -> a -> a) -> Instance a -> a #

toList :: Instance a -> [a] #

null :: Instance a -> Bool #

length :: Instance a -> Int #

elem :: Eq a => a -> Instance a -> Bool #

maximum :: Ord a => Instance a -> a #

minimum :: Ord a => Instance a -> a #

sum :: Num a => Instance a -> a #

product :: Num a => Instance a -> a #

Traversable Instance # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Instance a -> f (Instance b) #

sequenceA :: Applicative f => Instance (f a) -> f (Instance a) #

mapM :: Monad m => (a -> m b) -> Instance a -> m (Instance b) #

sequence :: Monad m => Instance (m a) -> m (Instance a) #

Generic (Instance a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Instance a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Instance a) = D1 ('MetaData "Instance" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Instance" 'PrefixI 'True) (S1 ('MetaSel ('Just "instHead") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (InstanceHead a)) :*: S1 ('MetaSel ('Just "instBody") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SourceToken, NonEmpty (InstanceBinding a))))))

Methods

from :: Instance a -> Rep (Instance a) x #

to :: Rep (Instance a) x -> Instance a #

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

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Instance a -> ShowS #

show :: Instance a -> String #

showList :: [Instance a] -> ShowS #

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

Defined in Language.PureScript.CST.Types

Methods

(==) :: Instance a -> Instance a -> Bool #

(/=) :: Instance a -> Instance a -> Bool #

Ord a => Ord (Instance a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Instance a -> Instance a -> Ordering #

(<) :: Instance a -> Instance a -> Bool #

(<=) :: Instance a -> Instance a -> Bool #

(>) :: Instance a -> Instance a -> Bool #

(>=) :: Instance a -> Instance a -> Bool #

max :: Instance a -> Instance a -> Instance a #

min :: Instance a -> Instance a -> Instance a #

type Rep (Instance a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Instance a) = D1 ('MetaData "Instance" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Instance" 'PrefixI 'True) (S1 ('MetaSel ('Just "instHead") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (InstanceHead a)) :*: S1 ('MetaSel ('Just "instBody") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SourceToken, NonEmpty (InstanceBinding a))))))

data InstanceBinding a #

Instances

Instances details
Functor InstanceBinding # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> InstanceBinding a -> InstanceBinding b #

(<$) :: a -> InstanceBinding b -> InstanceBinding a #

Foldable InstanceBinding # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => InstanceBinding m -> m #

foldMap :: Monoid m => (a -> m) -> InstanceBinding a -> m #

foldMap' :: Monoid m => (a -> m) -> InstanceBinding a -> m #

foldr :: (a -> b -> b) -> b -> InstanceBinding a -> b #

foldr' :: (a -> b -> b) -> b -> InstanceBinding a -> b #

foldl :: (b -> a -> b) -> b -> InstanceBinding a -> b #

foldl' :: (b -> a -> b) -> b -> InstanceBinding a -> b #

foldr1 :: (a -> a -> a) -> InstanceBinding a -> a #

foldl1 :: (a -> a -> a) -> InstanceBinding a -> a #

toList :: InstanceBinding a -> [a] #

null :: InstanceBinding a -> Bool #

length :: InstanceBinding a -> Int #

elem :: Eq a => a -> InstanceBinding a -> Bool #

maximum :: Ord a => InstanceBinding a -> a #

minimum :: Ord a => InstanceBinding a -> a #

sum :: Num a => InstanceBinding a -> a #

product :: Num a => InstanceBinding a -> a #

Traversable InstanceBinding # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> InstanceBinding a -> f (InstanceBinding b) #

sequenceA :: Applicative f => InstanceBinding (f a) -> f (InstanceBinding a) #

mapM :: Monad m => (a -> m b) -> InstanceBinding a -> m (InstanceBinding b) #

sequence :: Monad m => InstanceBinding (m a) -> m (InstanceBinding a) #

Generic (InstanceBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (InstanceBinding a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (InstanceBinding a) = D1 ('MetaData "InstanceBinding" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "InstanceBindingSignature" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Labeled (Name Ident) (Type a)))) :+: C1 ('MetaCons "InstanceBindingName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ValueBindingFields a))))
Show a => Show (InstanceBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (InstanceBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (InstanceBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (InstanceBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (InstanceBinding a) = D1 ('MetaData "InstanceBinding" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "InstanceBindingSignature" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Labeled (Name Ident) (Type a)))) :+: C1 ('MetaCons "InstanceBindingName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (ValueBindingFields a))))

data ImportDecl a #

Instances

Instances details
Functor ImportDecl # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> ImportDecl a -> ImportDecl b #

(<$) :: a -> ImportDecl b -> ImportDecl a #

Foldable ImportDecl # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => ImportDecl m -> m #

foldMap :: Monoid m => (a -> m) -> ImportDecl a -> m #

foldMap' :: Monoid m => (a -> m) -> ImportDecl a -> m #

foldr :: (a -> b -> b) -> b -> ImportDecl a -> b #

foldr' :: (a -> b -> b) -> b -> ImportDecl a -> b #

foldl :: (b -> a -> b) -> b -> ImportDecl a -> b #

foldl' :: (b -> a -> b) -> b -> ImportDecl a -> b #

foldr1 :: (a -> a -> a) -> ImportDecl a -> a #

foldl1 :: (a -> a -> a) -> ImportDecl a -> a #

toList :: ImportDecl a -> [a] #

null :: ImportDecl a -> Bool #

length :: ImportDecl a -> Int #

elem :: Eq a => a -> ImportDecl a -> Bool #

maximum :: Ord a => ImportDecl a -> a #

minimum :: Ord a => ImportDecl a -> a #

sum :: Num a => ImportDecl a -> a #

product :: Num a => ImportDecl a -> a #

Traversable ImportDecl # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> ImportDecl a -> f (ImportDecl b) #

sequenceA :: Applicative f => ImportDecl (f a) -> f (ImportDecl a) #

mapM :: Monad m => (a -> m b) -> ImportDecl a -> m (ImportDecl b) #

sequence :: Monad m => ImportDecl (m a) -> m (ImportDecl a) #

Generic (ImportDecl a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (ImportDecl a) 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: ImportDecl a -> Rep (ImportDecl a) x #

to :: Rep (ImportDecl a) x -> ImportDecl a #

Show a => Show (ImportDecl a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (ImportDecl a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: ImportDecl a -> ImportDecl a -> Bool #

(/=) :: ImportDecl a -> ImportDecl a -> Bool #

Ord a => Ord (ImportDecl a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (ImportDecl a) # 
Instance details

Defined in Language.PureScript.CST.Types

data Import a #

Instances

Instances details
Functor Import # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Import a -> Import b #

(<$) :: a -> Import b -> Import a #

Foldable Import # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Import m -> m #

foldMap :: Monoid m => (a -> m) -> Import a -> m #

foldMap' :: Monoid m => (a -> m) -> Import a -> m #

foldr :: (a -> b -> b) -> b -> Import a -> b #

foldr' :: (a -> b -> b) -> b -> Import a -> b #

foldl :: (b -> a -> b) -> b -> Import a -> b #

foldl' :: (b -> a -> b) -> b -> Import a -> b #

foldr1 :: (a -> a -> a) -> Import a -> a #

foldl1 :: (a -> a -> a) -> Import a -> a #

toList :: Import a -> [a] #

null :: Import a -> Bool #

length :: Import a -> Int #

elem :: Eq a => a -> Import a -> Bool #

maximum :: Ord a => Import a -> a #

minimum :: Ord a => Import a -> a #

sum :: Num a => Import a -> a #

product :: Num a => Import a -> a #

Traversable Import # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Import a -> f (Import b) #

sequenceA :: Applicative f => Import (f a) -> f (Import a) #

mapM :: Monad m => (a -> m b) -> Import a -> m (Import b) #

sequence :: Monad m => Import (m a) -> m (Import a) #

Generic (Import a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Import a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Import a) = D1 ('MetaData "Import" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) ((C1 ('MetaCons "ImportValue" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :+: C1 ('MetaCons "ImportOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (OpName 'ValueOpName))))) :+: (C1 ('MetaCons "ImportType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'TypeName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (DataMembers a))))) :+: (C1 ('MetaCons "ImportTypeOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (OpName 'TypeOpName))))) :+: C1 ('MetaCons "ImportClass" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'ClassName))))))))

Methods

from :: Import a -> Rep (Import a) x #

to :: Rep (Import a) x -> Import a #

Show a => Show (Import a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Import a -> ShowS #

show :: Import a -> String #

showList :: [Import a] -> ShowS #

Eq a => Eq (Import a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Import a -> Import a -> Bool #

(/=) :: Import a -> Import a -> Bool #

Ord a => Ord (Import a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Import a -> Import a -> Ordering #

(<) :: Import a -> Import a -> Bool #

(<=) :: Import a -> Import a -> Bool #

(>) :: Import a -> Import a -> Bool #

(>=) :: Import a -> Import a -> Bool #

max :: Import a -> Import a -> Import a #

min :: Import a -> Import a -> Import a #

type Rep (Import a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Import a) = D1 ('MetaData "Import" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) ((C1 ('MetaCons "ImportValue" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :+: C1 ('MetaCons "ImportOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (OpName 'ValueOpName))))) :+: (C1 ('MetaCons "ImportType" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'TypeName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (DataMembers a))))) :+: (C1 ('MetaCons "ImportTypeOp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (OpName 'TypeOpName))))) :+: C1 ('MetaCons "ImportClass" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'ClassName))))))))

data DataHead a #

Instances

Instances details
Functor DataHead # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> DataHead a -> DataHead b #

(<$) :: a -> DataHead b -> DataHead a #

Foldable DataHead # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => DataHead m -> m #

foldMap :: Monoid m => (a -> m) -> DataHead a -> m #

foldMap' :: Monoid m => (a -> m) -> DataHead a -> m #

foldr :: (a -> b -> b) -> b -> DataHead a -> b #

foldr' :: (a -> b -> b) -> b -> DataHead a -> b #

foldl :: (b -> a -> b) -> b -> DataHead a -> b #

foldl' :: (b -> a -> b) -> b -> DataHead a -> b #

foldr1 :: (a -> a -> a) -> DataHead a -> a #

foldl1 :: (a -> a -> a) -> DataHead a -> a #

toList :: DataHead a -> [a] #

null :: DataHead a -> Bool #

length :: DataHead a -> Int #

elem :: Eq a => a -> DataHead a -> Bool #

maximum :: Ord a => DataHead a -> a #

minimum :: Ord a => DataHead a -> a #

sum :: Num a => DataHead a -> a #

product :: Num a => DataHead a -> a #

Traversable DataHead # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> DataHead a -> f (DataHead b) #

sequenceA :: Applicative f => DataHead (f a) -> f (DataHead a) #

mapM :: Monad m => (a -> m b) -> DataHead a -> m (DataHead b) #

sequence :: Monad m => DataHead (m a) -> m (DataHead a) #

Generic (DataHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (DataHead a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (DataHead a) = D1 ('MetaData "DataHead" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "DataHead" 'PrefixI 'True) (S1 ('MetaSel ('Just "dataHdKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: (S1 ('MetaSel ('Just "dataHdName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'TypeName))) :*: S1 ('MetaSel ('Just "dataHdVars") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TypeVarBinding a]))))

Methods

from :: DataHead a -> Rep (DataHead a) x #

to :: Rep (DataHead a) x -> DataHead a #

Show a => Show (DataHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> DataHead a -> ShowS #

show :: DataHead a -> String #

showList :: [DataHead a] -> ShowS #

Eq a => Eq (DataHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: DataHead a -> DataHead a -> Bool #

(/=) :: DataHead a -> DataHead a -> Bool #

Ord a => Ord (DataHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: DataHead a -> DataHead a -> Ordering #

(<) :: DataHead a -> DataHead a -> Bool #

(<=) :: DataHead a -> DataHead a -> Bool #

(>) :: DataHead a -> DataHead a -> Bool #

(>=) :: DataHead a -> DataHead a -> Bool #

max :: DataHead a -> DataHead a -> DataHead a #

min :: DataHead a -> DataHead a -> DataHead a #

type Rep (DataHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (DataHead a) = D1 ('MetaData "DataHead" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "DataHead" 'PrefixI 'True) (S1 ('MetaSel ('Just "dataHdKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: (S1 ('MetaSel ('Just "dataHdName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'TypeName))) :*: S1 ('MetaSel ('Just "dataHdVars") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [TypeVarBinding a]))))

data DataCtor a #

Instances

Instances details
Functor DataCtor # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> DataCtor a -> DataCtor b #

(<$) :: a -> DataCtor b -> DataCtor a #

Foldable DataCtor # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => DataCtor m -> m #

foldMap :: Monoid m => (a -> m) -> DataCtor a -> m #

foldMap' :: Monoid m => (a -> m) -> DataCtor a -> m #

foldr :: (a -> b -> b) -> b -> DataCtor a -> b #

foldr' :: (a -> b -> b) -> b -> DataCtor a -> b #

foldl :: (b -> a -> b) -> b -> DataCtor a -> b #

foldl' :: (b -> a -> b) -> b -> DataCtor a -> b #

foldr1 :: (a -> a -> a) -> DataCtor a -> a #

foldl1 :: (a -> a -> a) -> DataCtor a -> a #

toList :: DataCtor a -> [a] #

null :: DataCtor a -> Bool #

length :: DataCtor a -> Int #

elem :: Eq a => a -> DataCtor a -> Bool #

maximum :: Ord a => DataCtor a -> a #

minimum :: Ord a => DataCtor a -> a #

sum :: Num a => DataCtor a -> a #

product :: Num a => DataCtor a -> a #

Traversable DataCtor # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> DataCtor a -> f (DataCtor b) #

sequenceA :: Applicative f => DataCtor (f a) -> f (DataCtor a) #

mapM :: Monad m => (a -> m b) -> DataCtor a -> m (DataCtor b) #

sequence :: Monad m => DataCtor (m a) -> m (DataCtor a) #

Generic (DataCtor a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (DataCtor a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (DataCtor a) = D1 ('MetaData "DataCtor" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "DataCtor" 'PrefixI 'True) (S1 ('MetaSel ('Just "dataCtorAnn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "dataCtorName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'ConstructorName))) :*: S1 ('MetaSel ('Just "dataCtorFields") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Type a]))))

Methods

from :: DataCtor a -> Rep (DataCtor a) x #

to :: Rep (DataCtor a) x -> DataCtor a #

Show a => Show (DataCtor a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> DataCtor a -> ShowS #

show :: DataCtor a -> String #

showList :: [DataCtor a] -> ShowS #

Eq a => Eq (DataCtor a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: DataCtor a -> DataCtor a -> Bool #

(/=) :: DataCtor a -> DataCtor a -> Bool #

Ord a => Ord (DataCtor a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: DataCtor a -> DataCtor a -> Ordering #

(<) :: DataCtor a -> DataCtor a -> Bool #

(<=) :: DataCtor a -> DataCtor a -> Bool #

(>) :: DataCtor a -> DataCtor a -> Bool #

(>=) :: DataCtor a -> DataCtor a -> Bool #

max :: DataCtor a -> DataCtor a -> DataCtor a #

min :: DataCtor a -> DataCtor a -> DataCtor a #

type Rep (DataCtor a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (DataCtor a) = D1 ('MetaData "DataCtor" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "DataCtor" 'PrefixI 'True) (S1 ('MetaSel ('Just "dataCtorAnn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Just "dataCtorName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name (ProperName 'ConstructorName))) :*: S1 ('MetaSel ('Just "dataCtorFields") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Type a]))))

data ClassHead a #

Instances

Instances details
Functor ClassHead # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> ClassHead a -> ClassHead b #

(<$) :: a -> ClassHead b -> ClassHead a #

Foldable ClassHead # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => ClassHead m -> m #

foldMap :: Monoid m => (a -> m) -> ClassHead a -> m #

foldMap' :: Monoid m => (a -> m) -> ClassHead a -> m #

foldr :: (a -> b -> b) -> b -> ClassHead a -> b #

foldr' :: (a -> b -> b) -> b -> ClassHead a -> b #

foldl :: (b -> a -> b) -> b -> ClassHead a -> b #

foldl' :: (b -> a -> b) -> b -> ClassHead a -> b #

foldr1 :: (a -> a -> a) -> ClassHead a -> a #

foldl1 :: (a -> a -> a) -> ClassHead a -> a #

toList :: ClassHead a -> [a] #

null :: ClassHead a -> Bool #

length :: ClassHead a -> Int #

elem :: Eq a => a -> ClassHead a -> Bool #

maximum :: Ord a => ClassHead a -> a #

minimum :: Ord a => ClassHead a -> a #

sum :: Num a => ClassHead a -> a #

product :: Num a => ClassHead a -> a #

Traversable ClassHead # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> ClassHead a -> f (ClassHead b) #

sequenceA :: Applicative f => ClassHead (f a) -> f (ClassHead a) #

mapM :: Monad m => (a -> m b) -> ClassHead a -> m (ClassHead b) #

sequence :: Monad m => ClassHead (m a) -> m (ClassHead a) #

Generic (ClassHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (ClassHead a) 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: ClassHead a -> Rep (ClassHead a) x #

to :: Rep (ClassHead a) x -> ClassHead a #

Show a => Show (ClassHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (ClassHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: ClassHead a -> ClassHead a -> Bool #

(/=) :: ClassHead a -> ClassHead a -> Bool #

Ord a => Ord (ClassHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (ClassHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

data ClassFundep #

Instances

Instances details
Generic ClassFundep # 
Instance details

Defined in Language.PureScript.CST.Types

Show ClassFundep # 
Instance details

Defined in Language.PureScript.CST.Types

Eq ClassFundep # 
Instance details

Defined in Language.PureScript.CST.Types

Ord ClassFundep # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep ClassFundep # 
Instance details

Defined in Language.PureScript.CST.Types

data InstanceHead a #

Instances

Instances details
Functor InstanceHead # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> InstanceHead a -> InstanceHead b #

(<$) :: a -> InstanceHead b -> InstanceHead a #

Foldable InstanceHead # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => InstanceHead m -> m #

foldMap :: Monoid m => (a -> m) -> InstanceHead a -> m #

foldMap' :: Monoid m => (a -> m) -> InstanceHead a -> m #

foldr :: (a -> b -> b) -> b -> InstanceHead a -> b #

foldr' :: (a -> b -> b) -> b -> InstanceHead a -> b #

foldl :: (b -> a -> b) -> b -> InstanceHead a -> b #

foldl' :: (b -> a -> b) -> b -> InstanceHead a -> b #

foldr1 :: (a -> a -> a) -> InstanceHead a -> a #

foldl1 :: (a -> a -> a) -> InstanceHead a -> a #

toList :: InstanceHead a -> [a] #

null :: InstanceHead a -> Bool #

length :: InstanceHead a -> Int #

elem :: Eq a => a -> InstanceHead a -> Bool #

maximum :: Ord a => InstanceHead a -> a #

minimum :: Ord a => InstanceHead a -> a #

sum :: Num a => InstanceHead a -> a #

product :: Num a => InstanceHead a -> a #

Traversable InstanceHead # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> InstanceHead a -> f (InstanceHead b) #

sequenceA :: Applicative f => InstanceHead (f a) -> f (InstanceHead a) #

mapM :: Monad m => (a -> m b) -> InstanceHead a -> m (InstanceHead b) #

sequence :: Monad m => InstanceHead (m a) -> m (InstanceHead a) #

Generic (InstanceHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (InstanceHead a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (InstanceHead a) = D1 ('MetaData "InstanceHead" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "InstanceHead" 'PrefixI 'True) ((S1 ('MetaSel ('Just "instKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "instNameSep") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Name Ident, SourceToken)))) :*: (S1 ('MetaSel ('Just "instConstraints") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (OneOrDelimited (Constraint a), SourceToken))) :*: (S1 ('MetaSel ('Just "instClass") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (ProperName 'ClassName))) :*: S1 ('MetaSel ('Just "instTypes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Type a])))))

Methods

from :: InstanceHead a -> Rep (InstanceHead a) x #

to :: Rep (InstanceHead a) x -> InstanceHead a #

Show a => Show (InstanceHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (InstanceHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (InstanceHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (InstanceHead a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (InstanceHead a) = D1 ('MetaData "InstanceHead" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "InstanceHead" 'PrefixI 'True) ((S1 ('MetaSel ('Just "instKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "instNameSep") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Name Ident, SourceToken)))) :*: (S1 ('MetaSel ('Just "instConstraints") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (OneOrDelimited (Constraint a), SourceToken))) :*: (S1 ('MetaSel ('Just "instClass") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (ProperName 'ClassName))) :*: S1 ('MetaSel ('Just "instTypes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Type a])))))

data Fixity #

Constructors

Infix 
Infixl 
Infixr 

Instances

Instances details
Generic Fixity # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep Fixity 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Fixity = D1 ('MetaData "Fixity" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Infix" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Infixl" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Infixr" 'PrefixI 'False) (U1 :: Type -> Type)))

Methods

from :: Fixity -> Rep Fixity x #

to :: Rep Fixity x -> Fixity #

Show Fixity # 
Instance details

Defined in Language.PureScript.CST.Types

Eq Fixity # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Fixity -> Fixity -> Bool #

(/=) :: Fixity -> Fixity -> Bool #

Ord Fixity # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Fixity # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Fixity = D1 ('MetaData "Fixity" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Infix" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Infixl" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Infixr" 'PrefixI 'False) (U1 :: Type -> Type)))

data FixityOp #

Instances

Instances details
Generic FixityOp # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: FixityOp -> Rep FixityOp x #

to :: Rep FixityOp x -> FixityOp #

Show FixityOp # 
Instance details

Defined in Language.PureScript.CST.Types

Eq FixityOp # 
Instance details

Defined in Language.PureScript.CST.Types

Ord FixityOp # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep FixityOp # 
Instance details

Defined in Language.PureScript.CST.Types

data FixityFields #

Instances

Instances details
Generic FixityFields # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep FixityFields 
Instance details

Defined in Language.PureScript.CST.Types

type Rep FixityFields = D1 ('MetaData "FixityFields" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "FixityFields" 'PrefixI 'True) (S1 ('MetaSel ('Just "fxtKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SourceToken, Fixity)) :*: (S1 ('MetaSel ('Just "fxtPrec") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SourceToken, Integer)) :*: S1 ('MetaSel ('Just "fxtOp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FixityOp))))
Show FixityFields # 
Instance details

Defined in Language.PureScript.CST.Types

Eq FixityFields # 
Instance details

Defined in Language.PureScript.CST.Types

Ord FixityFields # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep FixityFields # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep FixityFields = D1 ('MetaData "FixityFields" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "FixityFields" 'PrefixI 'True) (S1 ('MetaSel ('Just "fxtKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SourceToken, Fixity)) :*: (S1 ('MetaSel ('Just "fxtPrec") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (SourceToken, Integer)) :*: S1 ('MetaSel ('Just "fxtOp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FixityOp))))

data ValueBindingFields a #

Constructors

ValueBindingFields 

Instances

Instances details
Functor ValueBindingFields # 
Instance details

Defined in Language.PureScript.CST.Types

Foldable ValueBindingFields # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => ValueBindingFields m -> m #

foldMap :: Monoid m => (a -> m) -> ValueBindingFields a -> m #

foldMap' :: Monoid m => (a -> m) -> ValueBindingFields a -> m #

foldr :: (a -> b -> b) -> b -> ValueBindingFields a -> b #

foldr' :: (a -> b -> b) -> b -> ValueBindingFields a -> b #

foldl :: (b -> a -> b) -> b -> ValueBindingFields a -> b #

foldl' :: (b -> a -> b) -> b -> ValueBindingFields a -> b #

foldr1 :: (a -> a -> a) -> ValueBindingFields a -> a #

foldl1 :: (a -> a -> a) -> ValueBindingFields a -> a #

toList :: ValueBindingFields a -> [a] #

null :: ValueBindingFields a -> Bool #

length :: ValueBindingFields a -> Int #

elem :: Eq a => a -> ValueBindingFields a -> Bool #

maximum :: Ord a => ValueBindingFields a -> a #

minimum :: Ord a => ValueBindingFields a -> a #

sum :: Num a => ValueBindingFields a -> a #

product :: Num a => ValueBindingFields a -> a #

Traversable ValueBindingFields # 
Instance details

Defined in Language.PureScript.CST.Types

Generic (ValueBindingFields a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (ValueBindingFields a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (ValueBindingFields a) = D1 ('MetaData "ValueBindingFields" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "ValueBindingFields" 'PrefixI 'True) (S1 ('MetaSel ('Just "valName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident)) :*: (S1 ('MetaSel ('Just "valBinders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Binder a]) :*: S1 ('MetaSel ('Just "valGuarded") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Guarded a)))))
Show a => Show (ValueBindingFields a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (ValueBindingFields a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (ValueBindingFields a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (ValueBindingFields a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (ValueBindingFields a) = D1 ('MetaData "ValueBindingFields" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "ValueBindingFields" 'PrefixI 'True) (S1 ('MetaSel ('Just "valName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident)) :*: (S1 ('MetaSel ('Just "valBinders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Binder a]) :*: S1 ('MetaSel ('Just "valGuarded") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Guarded a)))))

data Guarded a #

Instances

Instances details
Functor Guarded # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Guarded a -> Guarded b #

(<$) :: a -> Guarded b -> Guarded a #

Foldable Guarded # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Guarded m -> m #

foldMap :: Monoid m => (a -> m) -> Guarded a -> m #

foldMap' :: Monoid m => (a -> m) -> Guarded a -> m #

foldr :: (a -> b -> b) -> b -> Guarded a -> b #

foldr' :: (a -> b -> b) -> b -> Guarded a -> b #

foldl :: (b -> a -> b) -> b -> Guarded a -> b #

foldl' :: (b -> a -> b) -> b -> Guarded a -> b #

foldr1 :: (a -> a -> a) -> Guarded a -> a #

foldl1 :: (a -> a -> a) -> Guarded a -> a #

toList :: Guarded a -> [a] #

null :: Guarded a -> Bool #

length :: Guarded a -> Int #

elem :: Eq a => a -> Guarded a -> Bool #

maximum :: Ord a => Guarded a -> a #

minimum :: Ord a => Guarded a -> a #

sum :: Num a => Guarded a -> a #

product :: Num a => Guarded a -> a #

Traversable Guarded # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Guarded a -> f (Guarded b) #

sequenceA :: Applicative f => Guarded (f a) -> f (Guarded a) #

mapM :: Monad m => (a -> m b) -> Guarded a -> m (Guarded b) #

sequence :: Monad m => Guarded (m a) -> m (Guarded a) #

Generic (Guarded a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Guarded a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Guarded a) = D1 ('MetaData "Guarded" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Unconditional" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Where a))) :+: C1 ('MetaCons "Guarded" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (GuardedExpr a)))))

Methods

from :: Guarded a -> Rep (Guarded a) x #

to :: Rep (Guarded a) x -> Guarded a #

Show a => Show (Guarded a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Guarded a -> ShowS #

show :: Guarded a -> String #

showList :: [Guarded a] -> ShowS #

Eq a => Eq (Guarded a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Guarded a -> Guarded a -> Bool #

(/=) :: Guarded a -> Guarded a -> Bool #

Ord a => Ord (Guarded a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Guarded a -> Guarded a -> Ordering #

(<) :: Guarded a -> Guarded a -> Bool #

(<=) :: Guarded a -> Guarded a -> Bool #

(>) :: Guarded a -> Guarded a -> Bool #

(>=) :: Guarded a -> Guarded a -> Bool #

max :: Guarded a -> Guarded a -> Guarded a #

min :: Guarded a -> Guarded a -> Guarded a #

type Rep (Guarded a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Guarded a) = D1 ('MetaData "Guarded" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Unconditional" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Where a))) :+: C1 ('MetaCons "Guarded" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (GuardedExpr a)))))

data GuardedExpr a #

Instances

Instances details
Functor GuardedExpr # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> GuardedExpr a -> GuardedExpr b #

(<$) :: a -> GuardedExpr b -> GuardedExpr a #

Foldable GuardedExpr # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => GuardedExpr m -> m #

foldMap :: Monoid m => (a -> m) -> GuardedExpr a -> m #

foldMap' :: Monoid m => (a -> m) -> GuardedExpr a -> m #

foldr :: (a -> b -> b) -> b -> GuardedExpr a -> b #

foldr' :: (a -> b -> b) -> b -> GuardedExpr a -> b #

foldl :: (b -> a -> b) -> b -> GuardedExpr a -> b #

foldl' :: (b -> a -> b) -> b -> GuardedExpr a -> b #

foldr1 :: (a -> a -> a) -> GuardedExpr a -> a #

foldl1 :: (a -> a -> a) -> GuardedExpr a -> a #

toList :: GuardedExpr a -> [a] #

null :: GuardedExpr a -> Bool #

length :: GuardedExpr a -> Int #

elem :: Eq a => a -> GuardedExpr a -> Bool #

maximum :: Ord a => GuardedExpr a -> a #

minimum :: Ord a => GuardedExpr a -> a #

sum :: Num a => GuardedExpr a -> a #

product :: Num a => GuardedExpr a -> a #

Traversable GuardedExpr # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> GuardedExpr a -> f (GuardedExpr b) #

sequenceA :: Applicative f => GuardedExpr (f a) -> f (GuardedExpr a) #

mapM :: Monad m => (a -> m b) -> GuardedExpr a -> m (GuardedExpr b) #

sequence :: Monad m => GuardedExpr (m a) -> m (GuardedExpr a) #

Generic (GuardedExpr a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (GuardedExpr a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (GuardedExpr a) = D1 ('MetaData "GuardedExpr" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "GuardedExpr" 'PrefixI 'True) ((S1 ('MetaSel ('Just "grdBar") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "grdPatterns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Separated (PatternGuard a)))) :*: (S1 ('MetaSel ('Just "grdSep") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "grdWhere") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Where a)))))

Methods

from :: GuardedExpr a -> Rep (GuardedExpr a) x #

to :: Rep (GuardedExpr a) x -> GuardedExpr a #

Show a => Show (GuardedExpr a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (GuardedExpr a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (GuardedExpr a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (GuardedExpr a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (GuardedExpr a) = D1 ('MetaData "GuardedExpr" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "GuardedExpr" 'PrefixI 'True) ((S1 ('MetaSel ('Just "grdBar") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "grdPatterns") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Separated (PatternGuard a)))) :*: (S1 ('MetaSel ('Just "grdSep") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "grdWhere") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Where a)))))

data PatternGuard a #

Constructors

PatternGuard 

Instances

Instances details
Functor PatternGuard # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> PatternGuard a -> PatternGuard b #

(<$) :: a -> PatternGuard b -> PatternGuard a #

Foldable PatternGuard # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => PatternGuard m -> m #

foldMap :: Monoid m => (a -> m) -> PatternGuard a -> m #

foldMap' :: Monoid m => (a -> m) -> PatternGuard a -> m #

foldr :: (a -> b -> b) -> b -> PatternGuard a -> b #

foldr' :: (a -> b -> b) -> b -> PatternGuard a -> b #

foldl :: (b -> a -> b) -> b -> PatternGuard a -> b #

foldl' :: (b -> a -> b) -> b -> PatternGuard a -> b #

foldr1 :: (a -> a -> a) -> PatternGuard a -> a #

foldl1 :: (a -> a -> a) -> PatternGuard a -> a #

toList :: PatternGuard a -> [a] #

null :: PatternGuard a -> Bool #

length :: PatternGuard a -> Int #

elem :: Eq a => a -> PatternGuard a -> Bool #

maximum :: Ord a => PatternGuard a -> a #

minimum :: Ord a => PatternGuard a -> a #

sum :: Num a => PatternGuard a -> a #

product :: Num a => PatternGuard a -> a #

Traversable PatternGuard # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> PatternGuard a -> f (PatternGuard b) #

sequenceA :: Applicative f => PatternGuard (f a) -> f (PatternGuard a) #

mapM :: Monad m => (a -> m b) -> PatternGuard a -> m (PatternGuard b) #

sequence :: Monad m => PatternGuard (m a) -> m (PatternGuard a) #

Generic (PatternGuard a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (PatternGuard a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (PatternGuard a) = D1 ('MetaData "PatternGuard" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "PatternGuard" 'PrefixI 'True) (S1 ('MetaSel ('Just "patBinder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Binder a, SourceToken))) :*: S1 ('MetaSel ('Just "patExpr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))))

Methods

from :: PatternGuard a -> Rep (PatternGuard a) x #

to :: Rep (PatternGuard a) x -> PatternGuard a #

Show a => Show (PatternGuard a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (PatternGuard a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (PatternGuard a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (PatternGuard a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (PatternGuard a) = D1 ('MetaData "PatternGuard" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "PatternGuard" 'PrefixI 'True) (S1 ('MetaSel ('Just "patBinder") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Binder a, SourceToken))) :*: S1 ('MetaSel ('Just "patExpr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))))

data Foreign a #

Instances

Instances details
Functor Foreign # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Foreign a -> Foreign b #

(<$) :: a -> Foreign b -> Foreign a #

Foldable Foreign # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Foreign m -> m #

foldMap :: Monoid m => (a -> m) -> Foreign a -> m #

foldMap' :: Monoid m => (a -> m) -> Foreign a -> m #

foldr :: (a -> b -> b) -> b -> Foreign a -> b #

foldr' :: (a -> b -> b) -> b -> Foreign a -> b #

foldl :: (b -> a -> b) -> b -> Foreign a -> b #

foldl' :: (b -> a -> b) -> b -> Foreign a -> b #

foldr1 :: (a -> a -> a) -> Foreign a -> a #

foldl1 :: (a -> a -> a) -> Foreign a -> a #

toList :: Foreign a -> [a] #

null :: Foreign a -> Bool #

length :: Foreign a -> Int #

elem :: Eq a => a -> Foreign a -> Bool #

maximum :: Ord a => Foreign a -> a #

minimum :: Ord a => Foreign a -> a #

sum :: Num a => Foreign a -> a #

product :: Num a => Foreign a -> a #

Traversable Foreign # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Foreign a -> f (Foreign b) #

sequenceA :: Applicative f => Foreign (f a) -> f (Foreign a) #

mapM :: Monad m => (a -> m b) -> Foreign a -> m (Foreign b) #

sequence :: Monad m => Foreign (m a) -> m (Foreign a) #

Generic (Foreign a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: Foreign a -> Rep (Foreign a) x #

to :: Rep (Foreign a) x -> Foreign a #

Show a => Show (Foreign a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Foreign a -> ShowS #

show :: Foreign a -> String #

showList :: [Foreign a] -> ShowS #

Eq a => Eq (Foreign a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Foreign a -> Foreign a -> Bool #

(/=) :: Foreign a -> Foreign a -> Bool #

Ord a => Ord (Foreign a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Foreign a -> Foreign a -> Ordering #

(<) :: Foreign a -> Foreign a -> Bool #

(<=) :: Foreign a -> Foreign a -> Bool #

(>) :: Foreign a -> Foreign a -> Bool #

(>=) :: Foreign a -> Foreign a -> Bool #

max :: Foreign a -> Foreign a -> Foreign a #

min :: Foreign a -> Foreign a -> Foreign a #

type Rep (Foreign a) # 
Instance details

Defined in Language.PureScript.CST.Types

data Role #

Constructors

Role 

Instances

Instances details
Generic Role # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep Role 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Role = D1 ('MetaData "Role" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Role" 'PrefixI 'True) (S1 ('MetaSel ('Just "roleTok") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "roleValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Role)))

Methods

from :: Role -> Rep Role x #

to :: Rep Role x -> Role #

Show Role # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Role -> ShowS #

show :: Role -> String #

showList :: [Role] -> ShowS #

Eq Role # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Role -> Role -> Bool #

(/=) :: Role -> Role -> Bool #

Ord Role # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Role -> Role -> Ordering #

(<) :: Role -> Role -> Bool #

(<=) :: Role -> Role -> Bool #

(>) :: Role -> Role -> Bool #

(>=) :: Role -> Role -> Bool #

max :: Role -> Role -> Role #

min :: Role -> Role -> Role #

type Rep Role # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep Role = D1 ('MetaData "Role" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Role" 'PrefixI 'True) (S1 ('MetaSel ('Just "roleTok") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "roleValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Role)))

data Expr a #

Instances

Instances details
Functor Expr # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Expr a -> Expr b #

(<$) :: a -> Expr b -> Expr a #

Foldable Expr # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Expr m -> m #

foldMap :: Monoid m => (a -> m) -> Expr a -> m #

foldMap' :: Monoid m => (a -> m) -> Expr a -> m #

foldr :: (a -> b -> b) -> b -> Expr a -> b #

foldr' :: (a -> b -> b) -> b -> Expr a -> b #

foldl :: (b -> a -> b) -> b -> Expr a -> b #

foldl' :: (b -> a -> b) -> b -> Expr a -> b #

foldr1 :: (a -> a -> a) -> Expr a -> a #

foldl1 :: (a -> a -> a) -> Expr a -> a #

toList :: Expr a -> [a] #

null :: Expr a -> Bool #

length :: Expr a -> Int #

elem :: Eq a => a -> Expr a -> Bool #

maximum :: Ord a => Expr a -> a #

minimum :: Ord a => Expr a -> a #

sum :: Num a => Expr a -> a #

product :: Num a => Expr a -> a #

Traversable Expr # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Expr a -> f (Expr b) #

sequenceA :: Applicative f => Expr (f a) -> f (Expr a) #

mapM :: Monad m => (a -> m b) -> Expr a -> m (Expr b) #

sequence :: Monad m => Expr (m a) -> m (Expr a) #

Generic (Expr a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Expr a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Expr a) = D1 ('MetaData "Expr" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) ((((C1 ('MetaCons "ExprHole" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :+: (C1 ('MetaCons "ExprSection" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :+: C1 ('MetaCons "ExprIdent" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName Ident))))) :+: (C1 ('MetaCons "ExprConstructor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (ProperName 'ConstructorName)))) :+: (C1 ('MetaCons "ExprBoolean" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :+: C1 ('MetaCons "ExprChar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Char)))))) :+: ((C1 ('MetaCons "ExprString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PSString))) :+: (C1 ('MetaCons "ExprNumber" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either Integer Double)))) :+: C1 ('MetaCons "ExprArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Delimited (Expr a)))))) :+: ((C1 ('MetaCons "ExprRecord" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Delimited (RecordLabeled (Expr a))))) :+: C1 ('MetaCons "ExprParens" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Expr a))))) :+: (C1 ('MetaCons "ExprTyped" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "ExprInfix" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Expr a))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))))))) :+: (((C1 ('MetaCons "ExprOp" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (OpName 'ValueOpName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))) :+: (C1 ('MetaCons "ExprOpName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (OpName 'ValueOpName)))) :+: C1 ('MetaCons "ExprNegate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))))) :+: (C1 ('MetaCons "ExprRecordAccessor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (RecordAccessor a))) :+: (C1 ('MetaCons "ExprRecordUpdate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DelimitedNonEmpty (RecordUpdate a))))) :+: C1 ('MetaCons "ExprApp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))))))) :+: ((C1 ('MetaCons "ExprVisibleTypeApp" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: (C1 ('MetaCons "ExprLambda" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Lambda a))) :+: C1 ('MetaCons "ExprIf" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IfThenElse a))))) :+: ((C1 ('MetaCons "ExprCase" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (CaseOf a))) :+: C1 ('MetaCons "ExprLet" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (LetIn a)))) :+: (C1 ('MetaCons "ExprDo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DoBlock a))) :+: C1 ('MetaCons "ExprAdo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (AdoBlock a))))))))

Methods

from :: Expr a -> Rep (Expr a) x #

to :: Rep (Expr a) x -> Expr a #

Show a => Show (Expr a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Expr a -> ShowS #

show :: Expr a -> String #

showList :: [Expr a] -> ShowS #

Eq a => Eq (Expr a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Expr a -> Expr a -> Bool #

(/=) :: Expr a -> Expr a -> Bool #

Ord a => Ord (Expr a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Expr a -> Expr a -> Ordering #

(<) :: Expr a -> Expr a -> Bool #

(<=) :: Expr a -> Expr a -> Bool #

(>) :: Expr a -> Expr a -> Bool #

(>=) :: Expr a -> Expr a -> Bool #

max :: Expr a -> Expr a -> Expr a #

min :: Expr a -> Expr a -> Expr a #

type Rep (Expr a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Expr a) = D1 ('MetaData "Expr" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) ((((C1 ('MetaCons "ExprHole" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :+: (C1 ('MetaCons "ExprSection" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :+: C1 ('MetaCons "ExprIdent" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName Ident))))) :+: (C1 ('MetaCons "ExprConstructor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (ProperName 'ConstructorName)))) :+: (C1 ('MetaCons "ExprBoolean" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :+: C1 ('MetaCons "ExprChar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Char)))))) :+: ((C1 ('MetaCons "ExprString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PSString))) :+: (C1 ('MetaCons "ExprNumber" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either Integer Double)))) :+: C1 ('MetaCons "ExprArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Delimited (Expr a)))))) :+: ((C1 ('MetaCons "ExprRecord" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Delimited (RecordLabeled (Expr a))))) :+: C1 ('MetaCons "ExprParens" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Expr a))))) :+: (C1 ('MetaCons "ExprTyped" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "ExprInfix" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Expr a))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))))))) :+: (((C1 ('MetaCons "ExprOp" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (OpName 'ValueOpName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))) :+: (C1 ('MetaCons "ExprOpName" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (OpName 'ValueOpName)))) :+: C1 ('MetaCons "ExprNegate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))))) :+: (C1 ('MetaCons "ExprRecordAccessor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (RecordAccessor a))) :+: (C1 ('MetaCons "ExprRecordUpdate" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DelimitedNonEmpty (RecordUpdate a))))) :+: C1 ('MetaCons "ExprApp" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))))))) :+: ((C1 ('MetaCons "ExprVisibleTypeApp" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: (C1 ('MetaCons "ExprLambda" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Lambda a))) :+: C1 ('MetaCons "ExprIf" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (IfThenElse a))))) :+: ((C1 ('MetaCons "ExprCase" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (CaseOf a))) :+: C1 ('MetaCons "ExprLet" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (LetIn a)))) :+: (C1 ('MetaCons "ExprDo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (DoBlock a))) :+: C1 ('MetaCons "ExprAdo" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (AdoBlock a))))))))

data RecordLabeled a #

Instances

Instances details
Functor RecordLabeled # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> RecordLabeled a -> RecordLabeled b #

(<$) :: a -> RecordLabeled b -> RecordLabeled a #

Foldable RecordLabeled # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => RecordLabeled m -> m #

foldMap :: Monoid m => (a -> m) -> RecordLabeled a -> m #

foldMap' :: Monoid m => (a -> m) -> RecordLabeled a -> m #

foldr :: (a -> b -> b) -> b -> RecordLabeled a -> b #

foldr' :: (a -> b -> b) -> b -> RecordLabeled a -> b #

foldl :: (b -> a -> b) -> b -> RecordLabeled a -> b #

foldl' :: (b -> a -> b) -> b -> RecordLabeled a -> b #

foldr1 :: (a -> a -> a) -> RecordLabeled a -> a #

foldl1 :: (a -> a -> a) -> RecordLabeled a -> a #

toList :: RecordLabeled a -> [a] #

null :: RecordLabeled a -> Bool #

length :: RecordLabeled a -> Int #

elem :: Eq a => a -> RecordLabeled a -> Bool #

maximum :: Ord a => RecordLabeled a -> a #

minimum :: Ord a => RecordLabeled a -> a #

sum :: Num a => RecordLabeled a -> a #

product :: Num a => RecordLabeled a -> a #

Traversable RecordLabeled # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> RecordLabeled a -> f (RecordLabeled b) #

sequenceA :: Applicative f => RecordLabeled (f a) -> f (RecordLabeled a) #

mapM :: Monad m => (a -> m b) -> RecordLabeled a -> m (RecordLabeled b) #

sequence :: Monad m => RecordLabeled (m a) -> m (RecordLabeled a) #

Generic (RecordLabeled a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (RecordLabeled a) 
Instance details

Defined in Language.PureScript.CST.Types

Show a => Show (RecordLabeled a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (RecordLabeled a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (RecordLabeled a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (RecordLabeled a) # 
Instance details

Defined in Language.PureScript.CST.Types

data RecordUpdate a #

Instances

Instances details
Functor RecordUpdate # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> RecordUpdate a -> RecordUpdate b #

(<$) :: a -> RecordUpdate b -> RecordUpdate a #

Foldable RecordUpdate # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => RecordUpdate m -> m #

foldMap :: Monoid m => (a -> m) -> RecordUpdate a -> m #

foldMap' :: Monoid m => (a -> m) -> RecordUpdate a -> m #

foldr :: (a -> b -> b) -> b -> RecordUpdate a -> b #

foldr' :: (a -> b -> b) -> b -> RecordUpdate a -> b #

foldl :: (b -> a -> b) -> b -> RecordUpdate a -> b #

foldl' :: (b -> a -> b) -> b -> RecordUpdate a -> b #

foldr1 :: (a -> a -> a) -> RecordUpdate a -> a #

foldl1 :: (a -> a -> a) -> RecordUpdate a -> a #

toList :: RecordUpdate a -> [a] #

null :: RecordUpdate a -> Bool #

length :: RecordUpdate a -> Int #

elem :: Eq a => a -> RecordUpdate a -> Bool #

maximum :: Ord a => RecordUpdate a -> a #

minimum :: Ord a => RecordUpdate a -> a #

sum :: Num a => RecordUpdate a -> a #

product :: Num a => RecordUpdate a -> a #

Traversable RecordUpdate # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> RecordUpdate a -> f (RecordUpdate b) #

sequenceA :: Applicative f => RecordUpdate (f a) -> f (RecordUpdate a) #

mapM :: Monad m => (a -> m b) -> RecordUpdate a -> m (RecordUpdate b) #

sequence :: Monad m => RecordUpdate (m a) -> m (RecordUpdate a) #

Generic (RecordUpdate a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: RecordUpdate a -> Rep (RecordUpdate a) x #

to :: Rep (RecordUpdate a) x -> RecordUpdate a #

Show a => Show (RecordUpdate a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (RecordUpdate a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (RecordUpdate a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (RecordUpdate a) # 
Instance details

Defined in Language.PureScript.CST.Types

data RecordAccessor a #

Instances

Instances details
Functor RecordAccessor # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> RecordAccessor a -> RecordAccessor b #

(<$) :: a -> RecordAccessor b -> RecordAccessor a #

Foldable RecordAccessor # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => RecordAccessor m -> m #

foldMap :: Monoid m => (a -> m) -> RecordAccessor a -> m #

foldMap' :: Monoid m => (a -> m) -> RecordAccessor a -> m #

foldr :: (a -> b -> b) -> b -> RecordAccessor a -> b #

foldr' :: (a -> b -> b) -> b -> RecordAccessor a -> b #

foldl :: (b -> a -> b) -> b -> RecordAccessor a -> b #

foldl' :: (b -> a -> b) -> b -> RecordAccessor a -> b #

foldr1 :: (a -> a -> a) -> RecordAccessor a -> a #

foldl1 :: (a -> a -> a) -> RecordAccessor a -> a #

toList :: RecordAccessor a -> [a] #

null :: RecordAccessor a -> Bool #

length :: RecordAccessor a -> Int #

elem :: Eq a => a -> RecordAccessor a -> Bool #

maximum :: Ord a => RecordAccessor a -> a #

minimum :: Ord a => RecordAccessor a -> a #

sum :: Num a => RecordAccessor a -> a #

product :: Num a => RecordAccessor a -> a #

Traversable RecordAccessor # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> RecordAccessor a -> f (RecordAccessor b) #

sequenceA :: Applicative f => RecordAccessor (f a) -> f (RecordAccessor a) #

mapM :: Monad m => (a -> m b) -> RecordAccessor a -> m (RecordAccessor b) #

sequence :: Monad m => RecordAccessor (m a) -> m (RecordAccessor a) #

Generic (RecordAccessor a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (RecordAccessor a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (RecordAccessor a) = D1 ('MetaData "RecordAccessor" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "RecordAccessor" 'PrefixI 'True) (S1 ('MetaSel ('Just "recExpr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)) :*: (S1 ('MetaSel ('Just "recDot") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "recPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Separated Label)))))
Show a => Show (RecordAccessor a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (RecordAccessor a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (RecordAccessor a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (RecordAccessor a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (RecordAccessor a) = D1 ('MetaData "RecordAccessor" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "RecordAccessor" 'PrefixI 'True) (S1 ('MetaSel ('Just "recExpr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)) :*: (S1 ('MetaSel ('Just "recDot") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "recPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Separated Label)))))

data Lambda a #

Instances

Instances details
Functor Lambda # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Lambda a -> Lambda b #

(<$) :: a -> Lambda b -> Lambda a #

Foldable Lambda # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Lambda m -> m #

foldMap :: Monoid m => (a -> m) -> Lambda a -> m #

foldMap' :: Monoid m => (a -> m) -> Lambda a -> m #

foldr :: (a -> b -> b) -> b -> Lambda a -> b #

foldr' :: (a -> b -> b) -> b -> Lambda a -> b #

foldl :: (b -> a -> b) -> b -> Lambda a -> b #

foldl' :: (b -> a -> b) -> b -> Lambda a -> b #

foldr1 :: (a -> a -> a) -> Lambda a -> a #

foldl1 :: (a -> a -> a) -> Lambda a -> a #

toList :: Lambda a -> [a] #

null :: Lambda a -> Bool #

length :: Lambda a -> Int #

elem :: Eq a => a -> Lambda a -> Bool #

maximum :: Ord a => Lambda a -> a #

minimum :: Ord a => Lambda a -> a #

sum :: Num a => Lambda a -> a #

product :: Num a => Lambda a -> a #

Traversable Lambda # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Lambda a -> f (Lambda b) #

sequenceA :: Applicative f => Lambda (f a) -> f (Lambda a) #

mapM :: Monad m => (a -> m b) -> Lambda a -> m (Lambda b) #

sequence :: Monad m => Lambda (m a) -> m (Lambda a) #

Generic (Lambda a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Lambda a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Lambda a) = D1 ('MetaData "Lambda" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Lambda" 'PrefixI 'True) ((S1 ('MetaSel ('Just "lmbSymbol") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "lmbBinders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (Binder a)))) :*: (S1 ('MetaSel ('Just "lmbArr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "lmbBody") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))))

Methods

from :: Lambda a -> Rep (Lambda a) x #

to :: Rep (Lambda a) x -> Lambda a #

Show a => Show (Lambda a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Lambda a -> ShowS #

show :: Lambda a -> String #

showList :: [Lambda a] -> ShowS #

Eq a => Eq (Lambda a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Lambda a -> Lambda a -> Bool #

(/=) :: Lambda a -> Lambda a -> Bool #

Ord a => Ord (Lambda a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Lambda a -> Lambda a -> Ordering #

(<) :: Lambda a -> Lambda a -> Bool #

(<=) :: Lambda a -> Lambda a -> Bool #

(>) :: Lambda a -> Lambda a -> Bool #

(>=) :: Lambda a -> Lambda a -> Bool #

max :: Lambda a -> Lambda a -> Lambda a #

min :: Lambda a -> Lambda a -> Lambda a #

type Rep (Lambda a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Lambda a) = D1 ('MetaData "Lambda" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Lambda" 'PrefixI 'True) ((S1 ('MetaSel ('Just "lmbSymbol") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "lmbBinders") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (Binder a)))) :*: (S1 ('MetaSel ('Just "lmbArr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "lmbBody") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))))

data IfThenElse a #

Instances

Instances details
Functor IfThenElse # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> IfThenElse a -> IfThenElse b #

(<$) :: a -> IfThenElse b -> IfThenElse a #

Foldable IfThenElse # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => IfThenElse m -> m #

foldMap :: Monoid m => (a -> m) -> IfThenElse a -> m #

foldMap' :: Monoid m => (a -> m) -> IfThenElse a -> m #

foldr :: (a -> b -> b) -> b -> IfThenElse a -> b #

foldr' :: (a -> b -> b) -> b -> IfThenElse a -> b #

foldl :: (b -> a -> b) -> b -> IfThenElse a -> b #

foldl' :: (b -> a -> b) -> b -> IfThenElse a -> b #

foldr1 :: (a -> a -> a) -> IfThenElse a -> a #

foldl1 :: (a -> a -> a) -> IfThenElse a -> a #

toList :: IfThenElse a -> [a] #

null :: IfThenElse a -> Bool #

length :: IfThenElse a -> Int #

elem :: Eq a => a -> IfThenElse a -> Bool #

maximum :: Ord a => IfThenElse a -> a #

minimum :: Ord a => IfThenElse a -> a #

sum :: Num a => IfThenElse a -> a #

product :: Num a => IfThenElse a -> a #

Traversable IfThenElse # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> IfThenElse a -> f (IfThenElse b) #

sequenceA :: Applicative f => IfThenElse (f a) -> f (IfThenElse a) #

mapM :: Monad m => (a -> m b) -> IfThenElse a -> m (IfThenElse b) #

sequence :: Monad m => IfThenElse (m a) -> m (IfThenElse a) #

Generic (IfThenElse a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (IfThenElse a) 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: IfThenElse a -> Rep (IfThenElse a) x #

to :: Rep (IfThenElse a) x -> IfThenElse a #

Show a => Show (IfThenElse a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (IfThenElse a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: IfThenElse a -> IfThenElse a -> Bool #

(/=) :: IfThenElse a -> IfThenElse a -> Bool #

Ord a => Ord (IfThenElse a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (IfThenElse a) # 
Instance details

Defined in Language.PureScript.CST.Types

data CaseOf a #

Instances

Instances details
Functor CaseOf # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> CaseOf a -> CaseOf b #

(<$) :: a -> CaseOf b -> CaseOf a #

Foldable CaseOf # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => CaseOf m -> m #

foldMap :: Monoid m => (a -> m) -> CaseOf a -> m #

foldMap' :: Monoid m => (a -> m) -> CaseOf a -> m #

foldr :: (a -> b -> b) -> b -> CaseOf a -> b #

foldr' :: (a -> b -> b) -> b -> CaseOf a -> b #

foldl :: (b -> a -> b) -> b -> CaseOf a -> b #

foldl' :: (b -> a -> b) -> b -> CaseOf a -> b #

foldr1 :: (a -> a -> a) -> CaseOf a -> a #

foldl1 :: (a -> a -> a) -> CaseOf a -> a #

toList :: CaseOf a -> [a] #

null :: CaseOf a -> Bool #

length :: CaseOf a -> Int #

elem :: Eq a => a -> CaseOf a -> Bool #

maximum :: Ord a => CaseOf a -> a #

minimum :: Ord a => CaseOf a -> a #

sum :: Num a => CaseOf a -> a #

product :: Num a => CaseOf a -> a #

Traversable CaseOf # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> CaseOf a -> f (CaseOf b) #

sequenceA :: Applicative f => CaseOf (f a) -> f (CaseOf a) #

mapM :: Monad m => (a -> m b) -> CaseOf a -> m (CaseOf b) #

sequence :: Monad m => CaseOf (m a) -> m (CaseOf a) #

Generic (CaseOf a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (CaseOf a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (CaseOf a) = D1 ('MetaData "CaseOf" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "CaseOf" 'PrefixI 'True) ((S1 ('MetaSel ('Just "caseKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "caseHead") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Separated (Expr a)))) :*: (S1 ('MetaSel ('Just "caseOf") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "caseBranches") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (Separated (Binder a), Guarded a))))))

Methods

from :: CaseOf a -> Rep (CaseOf a) x #

to :: Rep (CaseOf a) x -> CaseOf a #

Show a => Show (CaseOf a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> CaseOf a -> ShowS #

show :: CaseOf a -> String #

showList :: [CaseOf a] -> ShowS #

Eq a => Eq (CaseOf a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: CaseOf a -> CaseOf a -> Bool #

(/=) :: CaseOf a -> CaseOf a -> Bool #

Ord a => Ord (CaseOf a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: CaseOf a -> CaseOf a -> Ordering #

(<) :: CaseOf a -> CaseOf a -> Bool #

(<=) :: CaseOf a -> CaseOf a -> Bool #

(>) :: CaseOf a -> CaseOf a -> Bool #

(>=) :: CaseOf a -> CaseOf a -> Bool #

max :: CaseOf a -> CaseOf a -> CaseOf a #

min :: CaseOf a -> CaseOf a -> CaseOf a #

type Rep (CaseOf a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (CaseOf a) = D1 ('MetaData "CaseOf" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "CaseOf" 'PrefixI 'True) ((S1 ('MetaSel ('Just "caseKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "caseHead") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Separated (Expr a)))) :*: (S1 ('MetaSel ('Just "caseOf") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "caseBranches") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (Separated (Binder a), Guarded a))))))

data LetIn a #

Instances

Instances details
Functor LetIn # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> LetIn a -> LetIn b #

(<$) :: a -> LetIn b -> LetIn a #

Foldable LetIn # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => LetIn m -> m #

foldMap :: Monoid m => (a -> m) -> LetIn a -> m #

foldMap' :: Monoid m => (a -> m) -> LetIn a -> m #

foldr :: (a -> b -> b) -> b -> LetIn a -> b #

foldr' :: (a -> b -> b) -> b -> LetIn a -> b #

foldl :: (b -> a -> b) -> b -> LetIn a -> b #

foldl' :: (b -> a -> b) -> b -> LetIn a -> b #

foldr1 :: (a -> a -> a) -> LetIn a -> a #

foldl1 :: (a -> a -> a) -> LetIn a -> a #

toList :: LetIn a -> [a] #

null :: LetIn a -> Bool #

length :: LetIn a -> Int #

elem :: Eq a => a -> LetIn a -> Bool #

maximum :: Ord a => LetIn a -> a #

minimum :: Ord a => LetIn a -> a #

sum :: Num a => LetIn a -> a #

product :: Num a => LetIn a -> a #

Traversable LetIn # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> LetIn a -> f (LetIn b) #

sequenceA :: Applicative f => LetIn (f a) -> f (LetIn a) #

mapM :: Monad m => (a -> m b) -> LetIn a -> m (LetIn b) #

sequence :: Monad m => LetIn (m a) -> m (LetIn a) #

Generic (LetIn a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (LetIn a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (LetIn a) = D1 ('MetaData "LetIn" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "LetIn" 'PrefixI 'True) ((S1 ('MetaSel ('Just "letKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "letBindings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (LetBinding a)))) :*: (S1 ('MetaSel ('Just "letIn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "letBody") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))))

Methods

from :: LetIn a -> Rep (LetIn a) x #

to :: Rep (LetIn a) x -> LetIn a #

Show a => Show (LetIn a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> LetIn a -> ShowS #

show :: LetIn a -> String #

showList :: [LetIn a] -> ShowS #

Eq a => Eq (LetIn a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: LetIn a -> LetIn a -> Bool #

(/=) :: LetIn a -> LetIn a -> Bool #

Ord a => Ord (LetIn a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: LetIn a -> LetIn a -> Ordering #

(<) :: LetIn a -> LetIn a -> Bool #

(<=) :: LetIn a -> LetIn a -> Bool #

(>) :: LetIn a -> LetIn a -> Bool #

(>=) :: LetIn a -> LetIn a -> Bool #

max :: LetIn a -> LetIn a -> LetIn a #

min :: LetIn a -> LetIn a -> LetIn a #

type Rep (LetIn a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (LetIn a) = D1 ('MetaData "LetIn" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "LetIn" 'PrefixI 'True) ((S1 ('MetaSel ('Just "letKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "letBindings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (LetBinding a)))) :*: (S1 ('MetaSel ('Just "letIn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "letBody") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))))

data Where a #

Constructors

Where 

Instances

Instances details
Functor Where # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Where a -> Where b #

(<$) :: a -> Where b -> Where a #

Foldable Where # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Where m -> m #

foldMap :: Monoid m => (a -> m) -> Where a -> m #

foldMap' :: Monoid m => (a -> m) -> Where a -> m #

foldr :: (a -> b -> b) -> b -> Where a -> b #

foldr' :: (a -> b -> b) -> b -> Where a -> b #

foldl :: (b -> a -> b) -> b -> Where a -> b #

foldl' :: (b -> a -> b) -> b -> Where a -> b #

foldr1 :: (a -> a -> a) -> Where a -> a #

foldl1 :: (a -> a -> a) -> Where a -> a #

toList :: Where a -> [a] #

null :: Where a -> Bool #

length :: Where a -> Int #

elem :: Eq a => a -> Where a -> Bool #

maximum :: Ord a => Where a -> a #

minimum :: Ord a => Where a -> a #

sum :: Num a => Where a -> a #

product :: Num a => Where a -> a #

Traversable Where # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Where a -> f (Where b) #

sequenceA :: Applicative f => Where (f a) -> f (Where a) #

mapM :: Monad m => (a -> m b) -> Where a -> m (Where b) #

sequence :: Monad m => Where (m a) -> m (Where a) #

Generic (Where a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Where a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Where a) = D1 ('MetaData "Where" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Where" 'PrefixI 'True) (S1 ('MetaSel ('Just "whereExpr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)) :*: S1 ('MetaSel ('Just "whereBindings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SourceToken, NonEmpty (LetBinding a))))))

Methods

from :: Where a -> Rep (Where a) x #

to :: Rep (Where a) x -> Where a #

Show a => Show (Where a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Where a -> ShowS #

show :: Where a -> String #

showList :: [Where a] -> ShowS #

Eq a => Eq (Where a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Where a -> Where a -> Bool #

(/=) :: Where a -> Where a -> Bool #

Ord a => Ord (Where a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Where a -> Where a -> Ordering #

(<) :: Where a -> Where a -> Bool #

(<=) :: Where a -> Where a -> Bool #

(>) :: Where a -> Where a -> Bool #

(>=) :: Where a -> Where a -> Bool #

max :: Where a -> Where a -> Where a #

min :: Where a -> Where a -> Where a #

type Rep (Where a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Where a) = D1 ('MetaData "Where" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "Where" 'PrefixI 'True) (S1 ('MetaSel ('Just "whereExpr") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)) :*: S1 ('MetaSel ('Just "whereBindings") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (SourceToken, NonEmpty (LetBinding a))))))

data LetBinding a #

Instances

Instances details
Functor LetBinding # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> LetBinding a -> LetBinding b #

(<$) :: a -> LetBinding b -> LetBinding a #

Foldable LetBinding # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => LetBinding m -> m #

foldMap :: Monoid m => (a -> m) -> LetBinding a -> m #

foldMap' :: Monoid m => (a -> m) -> LetBinding a -> m #

foldr :: (a -> b -> b) -> b -> LetBinding a -> b #

foldr' :: (a -> b -> b) -> b -> LetBinding a -> b #

foldl :: (b -> a -> b) -> b -> LetBinding a -> b #

foldl' :: (b -> a -> b) -> b -> LetBinding a -> b #

foldr1 :: (a -> a -> a) -> LetBinding a -> a #

foldl1 :: (a -> a -> a) -> LetBinding a -> a #

toList :: LetBinding a -> [a] #

null :: LetBinding a -> Bool #

length :: LetBinding a -> Int #

elem :: Eq a => a -> LetBinding a -> Bool #

maximum :: Ord a => LetBinding a -> a #

minimum :: Ord a => LetBinding a -> a #

sum :: Num a => LetBinding a -> a #

product :: Num a => LetBinding a -> a #

Traversable LetBinding # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> LetBinding a -> f (LetBinding b) #

sequenceA :: Applicative f => LetBinding (f a) -> f (LetBinding a) #

mapM :: Monad m => (a -> m b) -> LetBinding a -> m (LetBinding b) #

sequence :: Monad m => LetBinding (m a) -> m (LetBinding a) #

Generic (LetBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: LetBinding a -> Rep (LetBinding a) x #

to :: Rep (LetBinding a) x -> LetBinding a #

Show a => Show (LetBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (LetBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: LetBinding a -> LetBinding a -> Bool #

(/=) :: LetBinding a -> LetBinding a -> Bool #

Ord a => Ord (LetBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (LetBinding a) # 
Instance details

Defined in Language.PureScript.CST.Types

data DoBlock a #

Instances

Instances details
Functor DoBlock # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> DoBlock a -> DoBlock b #

(<$) :: a -> DoBlock b -> DoBlock a #

Foldable DoBlock # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => DoBlock m -> m #

foldMap :: Monoid m => (a -> m) -> DoBlock a -> m #

foldMap' :: Monoid m => (a -> m) -> DoBlock a -> m #

foldr :: (a -> b -> b) -> b -> DoBlock a -> b #

foldr' :: (a -> b -> b) -> b -> DoBlock a -> b #

foldl :: (b -> a -> b) -> b -> DoBlock a -> b #

foldl' :: (b -> a -> b) -> b -> DoBlock a -> b #

foldr1 :: (a -> a -> a) -> DoBlock a -> a #

foldl1 :: (a -> a -> a) -> DoBlock a -> a #

toList :: DoBlock a -> [a] #

null :: DoBlock a -> Bool #

length :: DoBlock a -> Int #

elem :: Eq a => a -> DoBlock a -> Bool #

maximum :: Ord a => DoBlock a -> a #

minimum :: Ord a => DoBlock a -> a #

sum :: Num a => DoBlock a -> a #

product :: Num a => DoBlock a -> a #

Traversable DoBlock # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> DoBlock a -> f (DoBlock b) #

sequenceA :: Applicative f => DoBlock (f a) -> f (DoBlock a) #

mapM :: Monad m => (a -> m b) -> DoBlock a -> m (DoBlock b) #

sequence :: Monad m => DoBlock (m a) -> m (DoBlock a) #

Generic (DoBlock a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (DoBlock a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (DoBlock a) = D1 ('MetaData "DoBlock" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "DoBlock" 'PrefixI 'True) (S1 ('MetaSel ('Just "doKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "doStatements") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (DoStatement a)))))

Methods

from :: DoBlock a -> Rep (DoBlock a) x #

to :: Rep (DoBlock a) x -> DoBlock a #

Show a => Show (DoBlock a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> DoBlock a -> ShowS #

show :: DoBlock a -> String #

showList :: [DoBlock a] -> ShowS #

Eq a => Eq (DoBlock a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: DoBlock a -> DoBlock a -> Bool #

(/=) :: DoBlock a -> DoBlock a -> Bool #

Ord a => Ord (DoBlock a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: DoBlock a -> DoBlock a -> Ordering #

(<) :: DoBlock a -> DoBlock a -> Bool #

(<=) :: DoBlock a -> DoBlock a -> Bool #

(>) :: DoBlock a -> DoBlock a -> Bool #

(>=) :: DoBlock a -> DoBlock a -> Bool #

max :: DoBlock a -> DoBlock a -> DoBlock a #

min :: DoBlock a -> DoBlock a -> DoBlock a #

type Rep (DoBlock a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (DoBlock a) = D1 ('MetaData "DoBlock" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "DoBlock" 'PrefixI 'True) (S1 ('MetaSel ('Just "doKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "doStatements") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (NonEmpty (DoStatement a)))))

data DoStatement a #

Instances

Instances details
Functor DoStatement # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> DoStatement a -> DoStatement b #

(<$) :: a -> DoStatement b -> DoStatement a #

Foldable DoStatement # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => DoStatement m -> m #

foldMap :: Monoid m => (a -> m) -> DoStatement a -> m #

foldMap' :: Monoid m => (a -> m) -> DoStatement a -> m #

foldr :: (a -> b -> b) -> b -> DoStatement a -> b #

foldr' :: (a -> b -> b) -> b -> DoStatement a -> b #

foldl :: (b -> a -> b) -> b -> DoStatement a -> b #

foldl' :: (b -> a -> b) -> b -> DoStatement a -> b #

foldr1 :: (a -> a -> a) -> DoStatement a -> a #

foldl1 :: (a -> a -> a) -> DoStatement a -> a #

toList :: DoStatement a -> [a] #

null :: DoStatement a -> Bool #

length :: DoStatement a -> Int #

elem :: Eq a => a -> DoStatement a -> Bool #

maximum :: Ord a => DoStatement a -> a #

minimum :: Ord a => DoStatement a -> a #

sum :: Num a => DoStatement a -> a #

product :: Num a => DoStatement a -> a #

Traversable DoStatement # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> DoStatement a -> f (DoStatement b) #

sequenceA :: Applicative f => DoStatement (f a) -> f (DoStatement a) #

mapM :: Monad m => (a -> m b) -> DoStatement a -> m (DoStatement b) #

sequence :: Monad m => DoStatement (m a) -> m (DoStatement a) #

Generic (DoStatement a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

from :: DoStatement a -> Rep (DoStatement a) x #

to :: Rep (DoStatement a) x -> DoStatement a #

Show a => Show (DoStatement a) # 
Instance details

Defined in Language.PureScript.CST.Types

Eq a => Eq (DoStatement a) # 
Instance details

Defined in Language.PureScript.CST.Types

Ord a => Ord (DoStatement a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (DoStatement a) # 
Instance details

Defined in Language.PureScript.CST.Types

data AdoBlock a #

Instances

Instances details
Functor AdoBlock # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> AdoBlock a -> AdoBlock b #

(<$) :: a -> AdoBlock b -> AdoBlock a #

Foldable AdoBlock # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => AdoBlock m -> m #

foldMap :: Monoid m => (a -> m) -> AdoBlock a -> m #

foldMap' :: Monoid m => (a -> m) -> AdoBlock a -> m #

foldr :: (a -> b -> b) -> b -> AdoBlock a -> b #

foldr' :: (a -> b -> b) -> b -> AdoBlock a -> b #

foldl :: (b -> a -> b) -> b -> AdoBlock a -> b #

foldl' :: (b -> a -> b) -> b -> AdoBlock a -> b #

foldr1 :: (a -> a -> a) -> AdoBlock a -> a #

foldl1 :: (a -> a -> a) -> AdoBlock a -> a #

toList :: AdoBlock a -> [a] #

null :: AdoBlock a -> Bool #

length :: AdoBlock a -> Int #

elem :: Eq a => a -> AdoBlock a -> Bool #

maximum :: Ord a => AdoBlock a -> a #

minimum :: Ord a => AdoBlock a -> a #

sum :: Num a => AdoBlock a -> a #

product :: Num a => AdoBlock a -> a #

Traversable AdoBlock # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> AdoBlock a -> f (AdoBlock b) #

sequenceA :: Applicative f => AdoBlock (f a) -> f (AdoBlock a) #

mapM :: Monad m => (a -> m b) -> AdoBlock a -> m (AdoBlock b) #

sequence :: Monad m => AdoBlock (m a) -> m (AdoBlock a) #

Generic (AdoBlock a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (AdoBlock a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (AdoBlock a) = D1 ('MetaData "AdoBlock" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "AdoBlock" 'PrefixI 'True) ((S1 ('MetaSel ('Just "adoKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "adoStatements") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DoStatement a])) :*: (S1 ('MetaSel ('Just "adoIn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "adoResult") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))))

Methods

from :: AdoBlock a -> Rep (AdoBlock a) x #

to :: Rep (AdoBlock a) x -> AdoBlock a #

Show a => Show (AdoBlock a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> AdoBlock a -> ShowS #

show :: AdoBlock a -> String #

showList :: [AdoBlock a] -> ShowS #

Eq a => Eq (AdoBlock a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: AdoBlock a -> AdoBlock a -> Bool #

(/=) :: AdoBlock a -> AdoBlock a -> Bool #

Ord a => Ord (AdoBlock a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: AdoBlock a -> AdoBlock a -> Ordering #

(<) :: AdoBlock a -> AdoBlock a -> Bool #

(<=) :: AdoBlock a -> AdoBlock a -> Bool #

(>) :: AdoBlock a -> AdoBlock a -> Bool #

(>=) :: AdoBlock a -> AdoBlock a -> Bool #

max :: AdoBlock a -> AdoBlock a -> AdoBlock a #

min :: AdoBlock a -> AdoBlock a -> AdoBlock a #

type Rep (AdoBlock a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (AdoBlock a) = D1 ('MetaData "AdoBlock" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (C1 ('MetaCons "AdoBlock" 'PrefixI 'True) ((S1 ('MetaSel ('Just "adoKeyword") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "adoStatements") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [DoStatement a])) :*: (S1 ('MetaSel ('Just "adoIn") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Just "adoResult") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Expr a)))))

data Binder a #

Instances

Instances details
Functor Binder # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fmap :: (a -> b) -> Binder a -> Binder b #

(<$) :: a -> Binder b -> Binder a #

Foldable Binder # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

fold :: Monoid m => Binder m -> m #

foldMap :: Monoid m => (a -> m) -> Binder a -> m #

foldMap' :: Monoid m => (a -> m) -> Binder a -> m #

foldr :: (a -> b -> b) -> b -> Binder a -> b #

foldr' :: (a -> b -> b) -> b -> Binder a -> b #

foldl :: (b -> a -> b) -> b -> Binder a -> b #

foldl' :: (b -> a -> b) -> b -> Binder a -> b #

foldr1 :: (a -> a -> a) -> Binder a -> a #

foldl1 :: (a -> a -> a) -> Binder a -> a #

toList :: Binder a -> [a] #

null :: Binder a -> Bool #

length :: Binder a -> Int #

elem :: Eq a => a -> Binder a -> Bool #

maximum :: Ord a => Binder a -> a #

minimum :: Ord a => Binder a -> a #

sum :: Num a => Binder a -> a #

product :: Num a => Binder a -> a #

Traversable Binder # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

traverse :: Applicative f => (a -> f b) -> Binder a -> f (Binder b) #

sequenceA :: Applicative f => Binder (f a) -> f (Binder a) #

mapM :: Monad m => (a -> m b) -> Binder a -> m (Binder b) #

sequence :: Monad m => Binder (m a) -> m (Binder a) #

Generic (Binder a) # 
Instance details

Defined in Language.PureScript.CST.Types

Associated Types

type Rep (Binder a) 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Binder a) = D1 ('MetaData "Binder" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (((C1 ('MetaCons "BinderWildcard" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :+: (C1 ('MetaCons "BinderVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :+: C1 ('MetaCons "BinderNamed" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Binder a)))))) :+: (C1 ('MetaCons "BinderConstructor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (ProperName 'ConstructorName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Binder a]))) :+: (C1 ('MetaCons "BinderBoolean" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :+: C1 ('MetaCons "BinderChar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Char)))))) :+: ((C1 ('MetaCons "BinderString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PSString))) :+: (C1 ('MetaCons "BinderNumber" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SourceToken))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either Integer Double)))) :+: C1 ('MetaCons "BinderArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Delimited (Binder a)))))) :+: ((C1 ('MetaCons "BinderRecord" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Delimited (RecordLabeled (Binder a))))) :+: C1 ('MetaCons "BinderParens" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Binder a))))) :+: (C1 ('MetaCons "BinderTyped" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Binder a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "BinderOp" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Binder a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (OpName 'ValueOpName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Binder a))))))))

Methods

from :: Binder a -> Rep (Binder a) x #

to :: Rep (Binder a) x -> Binder a #

Show a => Show (Binder a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

showsPrec :: Int -> Binder a -> ShowS #

show :: Binder a -> String #

showList :: [Binder a] -> ShowS #

Eq a => Eq (Binder a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

(==) :: Binder a -> Binder a -> Bool #

(/=) :: Binder a -> Binder a -> Bool #

Ord a => Ord (Binder a) # 
Instance details

Defined in Language.PureScript.CST.Types

Methods

compare :: Binder a -> Binder a -> Ordering #

(<) :: Binder a -> Binder a -> Bool #

(<=) :: Binder a -> Binder a -> Bool #

(>) :: Binder a -> Binder a -> Bool #

(>=) :: Binder a -> Binder a -> Bool #

max :: Binder a -> Binder a -> Binder a #

min :: Binder a -> Binder a -> Binder a #

type Rep (Binder a) # 
Instance details

Defined in Language.PureScript.CST.Types

type Rep (Binder a) = D1 ('MetaData "Binder" "Language.PureScript.CST.Types" "purescript-0.15.15-8K0LbmS63k4ILju2RsIrDp" 'False) (((C1 ('MetaCons "BinderWildcard" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken)) :+: (C1 ('MetaCons "BinderVar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :+: C1 ('MetaCons "BinderNamed" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Name Ident))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Binder a)))))) :+: (C1 ('MetaCons "BinderConstructor" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (ProperName 'ConstructorName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 [Binder a]))) :+: (C1 ('MetaCons "BinderBoolean" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))) :+: C1 ('MetaCons "BinderChar" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Char)))))) :+: ((C1 ('MetaCons "BinderString" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PSString))) :+: (C1 ('MetaCons "BinderNumber" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe SourceToken))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Either Integer Double)))) :+: C1 ('MetaCons "BinderArray" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Delimited (Binder a)))))) :+: ((C1 ('MetaCons "BinderRecord" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Delimited (RecordLabeled (Binder a))))) :+: C1 ('MetaCons "BinderParens" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Wrapped (Binder a))))) :+: (C1 ('MetaCons "BinderTyped" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Binder a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SourceToken) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Type a)))) :+: C1 ('MetaCons "BinderOp" 'PrefixI 'False) ((S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Binder a))) :*: (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (QualifiedName (OpName 'ValueOpName))) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Binder a))))))))