morley-0.7.0: Developer tools for the Michelson Language
Michelson.Untyped.Contract
Description
Michelson contract in untyped model.
type Parameter = Type Source #
type Storage = Type Source #
data Contract' op Source #
Constructors
Fields
Defined in Michelson.Untyped.Contract
Methods
fmap :: (a -> b) -> Contract' a -> Contract' b #
(<$) :: a -> Contract' b -> Contract' a #
(==) :: Contract' op -> Contract' op -> Bool #
(/=) :: Contract' op -> Contract' op -> Bool #
gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Contract' op -> c (Contract' op) #
gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c (Contract' op) #
toConstr :: Contract' op -> Constr #
dataTypeOf :: Contract' op -> DataType #
dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c (Contract' op)) #
dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c (Contract' op)) #
gmapT :: (forall b. Data b => b -> b) -> Contract' op -> Contract' op #
gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Contract' op -> r #
gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Contract' op -> r #
gmapQ :: (forall d. Data d => d -> u) -> Contract' op -> [u] #
gmapQi :: Int -> (forall d. Data d => d -> u) -> Contract' op -> u #
gmapM :: Monad m => (forall d. Data d => d -> m d) -> Contract' op -> m (Contract' op) #
gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Contract' op -> m (Contract' op) #
gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Contract' op -> m (Contract' op) #
showsPrec :: Int -> Contract' op -> ShowS #
show :: Contract' op -> String #
showList :: [Contract' op] -> ShowS #
Associated Types
type Rep (Contract' op) :: Type -> Type #
from :: Contract' op -> Rep (Contract' op) x #
to :: Rep (Contract' op) x -> Contract' op #
Defined in Util.Test.Arbitrary
arbitrary :: Gen (Contract' op) #
shrink :: Contract' op -> [Contract' op] #
toJSON :: Contract' op -> Value #
toEncoding :: Contract' op -> Encoding #
toJSONList :: [Contract' op] -> Value #
toEncodingList :: [Contract' op] -> Encoding #
parseJSON :: Value -> Parser (Contract' op) #
parseJSONList :: Value -> Parser [Contract' op] #
build :: Contract' op -> Builder #
toADTArbitrarySingleton :: Proxy (Contract' op) -> Gen (ADTArbitrarySingleton (Contract' op)) #
toADTArbitrary :: Proxy (Contract' op) -> Gen (ADTArbitrary (Contract' op)) #
renderDoc :: RenderContext -> Contract' op -> Doc Source #
isRenderable :: Contract' op -> Bool Source #