pads-haskell-0.1.0.0: PADS data description language for Haskell.

Copyright(c) 2011
Kathleen Fisher <kathleen.fisher@gmail.com>
John Launchbury <john.launchbury@gmail.com>
LicenseMIT
MaintainerKarl Cronburg <karl@cs.tufts.edu>
Stabilityexperimental
Safe HaskellNone
LanguageHaskell2010

Language.Pads.Errors

Description

 
Synopsis

Documentation

data ErrMsg Source #

Errors which can be encountered at runtime when parsing a Pads type

Instances
Eq ErrMsg Source # 
Instance details

Defined in Language.Pads.Errors

Methods

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

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

Data ErrMsg Source # 
Instance details

Defined in Language.Pads.Errors

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ErrMsg -> c ErrMsg #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ErrMsg #

toConstr :: ErrMsg -> Constr #

dataTypeOf :: ErrMsg -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ErrMsg) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ErrMsg) #

gmapT :: (forall b. Data b => b -> b) -> ErrMsg -> ErrMsg #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ErrMsg -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ErrMsg -> r #

gmapQ :: (forall d. Data d => d -> u) -> ErrMsg -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ErrMsg -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ErrMsg -> m ErrMsg #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrMsg -> m ErrMsg #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrMsg -> m ErrMsg #

Ord ErrMsg Source # 
Instance details

Defined in Language.Pads.Errors

Show ErrMsg Source # 
Instance details

Defined in Language.Pads.Errors

Pretty ErrMsg Source #

Pretty printer for Pads runtime error messages.

Instance details

Defined in Language.Pads.Errors

Methods

ppr :: ErrMsg -> Doc #

pprPrec :: Int -> ErrMsg -> Doc #

pprList :: [ErrMsg] -> Doc #

data ErrInfo Source #

Error information relating back to the source input

Constructors

ErrInfo 

Fields

Instances
Eq ErrInfo Source # 
Instance details

Defined in Language.Pads.Errors

Methods

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

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

Data ErrInfo Source # 
Instance details

Defined in Language.Pads.Errors

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ErrInfo -> c ErrInfo #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ErrInfo #

toConstr :: ErrInfo -> Constr #

dataTypeOf :: ErrInfo -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ErrInfo) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ErrInfo) #

gmapT :: (forall b. Data b => b -> b) -> ErrInfo -> ErrInfo #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ErrInfo -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ErrInfo -> r #

gmapQ :: (forall d. Data d => d -> u) -> ErrInfo -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ErrInfo -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ErrInfo -> m ErrInfo #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrInfo -> m ErrInfo #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrInfo -> m ErrInfo #

Ord ErrInfo Source # 
Instance details

Defined in Language.Pads.Errors

Show ErrInfo Source # 
Instance details

Defined in Language.Pads.Errors

Pretty ErrInfo Source #

Pretty printer for reporting where in the source text a parse error occured.

Instance details

Defined in Language.Pads.Errors

Methods

ppr :: ErrInfo -> Doc #

pprPrec :: Int -> ErrInfo -> Doc #

pprList :: [ErrInfo] -> Doc #

mergeErrInfo :: ErrInfo -> ErrInfo -> ErrInfo Source #

Always just pick the first error message

maybeMergeErrInfo :: Maybe ErrInfo -> Maybe ErrInfo -> Maybe ErrInfo Source #

Merge errors in the Maybe monad