gll-0.4.1.1: GLL parser with simple combinator interface
Safe HaskellSafe-Inferred
LanguageHaskell2010

GLL.Types.TypeCompose

Description

Definition copied from TypeCompose-0.9.14: https://hackage.haskell.org/package/TypeCompose-0.9.14

Synopsis
  • newtype OO f j a b = OO {}

Documentation

newtype OO f j a b Source #

Composition of type constructors: unary with binary. Called StaticArrow in [1].

Constructors

OO 

Fields

  • unOO :: f (a `j` b)
     

Instances

Instances details
HasAlts AltExprs Source # 
Instance details

Defined in GLL.Combinators.Visit.Join

Methods

altsOf :: (Show t, Ord t) => AltExprs t b -> [AltExpr t b] Source #

IsAltExpr AltExprs Source # 
Instance details

Defined in GLL.Combinators.Visit.Join

Methods

toAlt :: (Show t, Ord t) => AltExprs t b -> AltExpr t b Source #

IsSymbExpr AltExprs Source # 
Instance details

Defined in GLL.Combinators.Visit.Join

Methods

toSymb :: (Show t, Ord t) => AltExprs t b -> SymbExpr t b Source #

mkRule :: (Show t, Ord t) => AltExprs t b -> BNF t b Source #

(Applicative f, Category cat) => Category (OO f cat :: Type -> Type -> Type) Source # 
Instance details

Defined in GLL.Types.TypeCompose

Methods

id :: forall (a :: k). OO f cat a a #

(.) :: forall (b :: k) (c :: k) (a :: k). OO f cat b c -> OO f cat a b -> OO f cat a c #

(Applicative f, Arrow arr) => Arrow (OO f arr) Source # 
Instance details

Defined in GLL.Types.TypeCompose

Methods

arr :: (b -> c) -> OO f arr b c #

first :: OO f arr b c -> OO f arr (b, d) (c, d) #

second :: OO f arr b c -> OO f arr (d, b) (d, c) #

(***) :: OO f arr b c -> OO f arr b' c' -> OO f arr (b, b') (c, c') #

(&&&) :: OO f arr b c -> OO f arr b c' -> OO f arr b (c, c') #