Safe Haskell | None |
---|---|
Language | Haskell2010 |
Michelson types represented in untyped model.
Documentation
Type T TypeAnn | |
TypeParameter | Implicit Parameter type which can be used in contract code |
TypeStorage | Implicit Storage type which can be used in contract code |
Instances
Eq Type Source # | |
Data Type Source # | |
Defined in Michelson.Untyped.Type gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Type -> c Type # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Type # dataTypeOf :: Type -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Type) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Type) # gmapT :: (forall b. Data b => b -> b) -> Type -> Type # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Type -> r # gmapQ :: (forall d. Data d => d -> u) -> Type -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Type -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Type -> m Type # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Type -> m Type # | |
Show Type Source # | |
Generic Type Source # | |
Arbitrary Type Source # | |
ToJSON Type Source # | |
Defined in Michelson.Untyped.Type | |
FromJSON Type Source # | |
Buildable Type Source # | |
Defined in Michelson.Untyped.Type | |
ToADTArbitrary Type Source # | |
Defined in Util.Test.Arbitrary toADTArbitrarySingleton :: Proxy Type -> Gen (ADTArbitrarySingleton Type) # toADTArbitrary :: Proxy Type -> Gen (ADTArbitrary Type) # | |
RenderDoc Type Source # | |
type Rep Type Source # | |
Defined in Michelson.Untyped.Type type Rep Type = D1 (MetaData "Type" "Michelson.Untyped.Type" "morley-0.3.0.1-Avb9bjjqJWNEobyGi9OGAh" False) (C1 (MetaCons "Type" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 T) :*: S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 TypeAnn)) :+: (C1 (MetaCons "TypeParameter" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TypeStorage" PrefixI False) (U1 :: Type -> Type))) |
data Comparable Source #
Instances
compToType :: Comparable -> Type Source #
typeToComp :: Type -> Maybe Comparable Source #
Instances
Instances
pattern Ttimestamp :: T Source #
ttimestamp :: T Source #
isAtomicType :: Type -> Bool Source #
isSignature :: Type -> Bool Source #
isComparable :: Type -> Bool Source #
isTimestamp :: Type -> Bool Source #