Safe Haskell | None |
---|---|
Language | Haskell2010 |
Michelson.Typed.Polymorphic
Description
Module, containing type classes for operating with Michelson values in the context of polymorphic stack type operations.
Documentation
class EDivOp (n :: T) (m :: T) where Source #
Methods
convergeEDiv :: Notes n -> Notes m -> Either AnnConvergeError (Notes ('TOption ('TPair (EDivOpRes n m) (EModOpRes n m)))) Source #
Converge the notes of given operands.
evalEDivOp :: Value' instr n -> Value' instr m -> Value' instr ('TOption ('TPair (EDivOpRes n m) (EModOpRes n m))) Source #
Instances
class MapOp (c :: T) where Source #
Methods
mapOpToList :: Value' instr c -> [Value' instr (MapOpInp c)] Source #
mapOpFromList :: KnownT b => Value' instr c -> [Value' instr b] -> Value' instr (MapOpRes c b) Source #
Instances
MapOp ('TList e) Source # | |
Defined in Michelson.Typed.Polymorphic Methods mapOpToList :: forall (instr :: [T] -> [T] -> Type). Value' instr ('TList e) -> [Value' instr (MapOpInp ('TList e))] Source # mapOpFromList :: forall (b :: T) (instr :: [T] -> [T] -> Type). KnownT b => Value' instr ('TList e) -> [Value' instr b] -> Value' instr (MapOpRes ('TList e) b) Source # | |
MapOp ('TMap k v) Source # | |
Defined in Michelson.Typed.Polymorphic Methods mapOpToList :: forall (instr :: [T] -> [T] -> Type). Value' instr ('TMap k v) -> [Value' instr (MapOpInp ('TMap k v))] Source # mapOpFromList :: forall (b :: T) (instr :: [T] -> [T] -> Type). KnownT b => Value' instr ('TMap k v) -> [Value' instr b] -> Value' instr (MapOpRes ('TMap k v) b) Source # |
class IterOp (c :: T) where Source #
Methods
iterOpDetachOne :: Value' instr c -> (Maybe (Value' instr (IterOpEl c)), Value' instr c) Source #
class GetOp (c :: T) where Source #
Methods
evalGet :: Value' instr (GetOpKey c) -> Value' instr c -> Maybe (Value' instr (GetOpVal c)) Source #
class UpdOp (c :: T) where Source #
Methods
evalUpd :: Value' instr (UpdOpKey c) -> Value' instr (UpdOpParams c) -> Value' instr c -> Value' instr c Source #
Instances
UpdOp ('TSet a) Source # | |
Defined in Michelson.Typed.Polymorphic | |
UpdOp ('TMap k v) Source # | |
Defined in Michelson.Typed.Polymorphic | |
UpdOp ('TBigMap k v) Source # | |