Safe Haskell | None |
---|---|
Language | Haskell2010 |
Operators for expressions over lifted values
- Lifting Fortran types to higher-level representations
- Folds over arrays (sum, product)
- High-level mathematical functions (factorial...)
Documentation
data HighOp t a where Source #
Instances
HFunctor HighOp Source # | |
Defined in Language.Fortran.Model.Op.High | |
HTraversable HighOp Source # | |
Defined in Language.Fortran.Model.Op.High htraverse :: forall f t t' (a :: u). Applicative f => (forall (b :: u). t b -> f (t' b)) -> HighOp t a -> f (HighOp t' a) hsequence :: forall f (t :: u -> Type) (a :: u). Applicative f => HighOp (Compose f t) a -> f (HighOp t a) | |
Pretty2 HighOp Source # | |
Defined in Language.Fortran.Model.Op.High | |
(MonadReader r m, HasPrimReprHandlers r) => HFoldableAt (Compose m HighRepr :: Type -> Type) HighOp Source # | |
data LiftDOp t a where Source #
Instances
HFunctor LiftDOp Source # | |
Defined in Language.Fortran.Model.Op.High | |
HTraversable LiftDOp Source # | |
Defined in Language.Fortran.Model.Op.High htraverse :: forall f t t' (a :: u). Applicative f => (forall (b :: u). t b -> f (t' b)) -> LiftDOp t a -> f (LiftDOp t' a) hsequence :: forall f (t :: u -> Type) (a :: u). Applicative f => LiftDOp (Compose f t) a -> f (LiftDOp t a) | |
Pretty2 LiftDOp Source # | |
Defined in Language.Fortran.Model.Op.High | |
(MonadReader r m, HasPrimReprHandlers r) => HFoldableAt (Compose m HighRepr :: Type -> Type) LiftDOp Source # | |