Safe Haskell | None |
---|---|
Language | Haskell2010 |
For expressions over normal Fortran values that are not representable in Fortran.
- Immutable array update (
MopWriteArr
) - Immutable data update (
MopWriteData
) - Explicit coercions (
MopCoercePrim
)
Documentation
data MetaOp t a where Source #
MopWriteArr :: D (Array i v) -> t (Array i v) -> t i -> t v -> MetaOp t (Array i v) | |
MopWriteData :: RElem '(fname, a) fields i => D (Record rname fields) -> SSymbol fname -> D a -> t (Record rname fields) -> t a -> MetaOp t (Record rname fields) | In
|
MopCoercePrim :: Prim p k b -> t (PrimS a) -> MetaOp t (PrimS b) |
Instances
HFunctor MetaOp Source # | |
Defined in Language.Fortran.Model.Op.Meta | |
HTraversable MetaOp Source # | |
Defined in Language.Fortran.Model.Op.Meta htraverse :: forall f t t' (a :: u). Applicative f => (forall (b :: u). t b -> f (t' b)) -> MetaOp t a -> f (MetaOp t' a) hsequence :: forall f (t :: u -> Type) (a :: u). Applicative f => MetaOp (Compose f t) a -> f (MetaOp t a) | |
Pretty2 MetaOp Source # | |
Defined in Language.Fortran.Model.Op.Meta | |
MonadEvalFortran r m => HFoldableAt (Compose m HighRepr :: Type -> Type) MetaOp Source # | |
MonadEvalFortran r m => HFoldableAt (Compose m CoreRepr :: Type -> Type) MetaOp Source # | |