{-# LANGUAGE QuantifiedConstraints #-}
module Michelson.Typed.Instr
( Instr (..)
, ExtInstr (..)
, CommentType (..)
, StackRef (..)
, mkStackRef
, PrintComment (..)
, TestAssert (..)
, ContractCode
, Contract (..)
, mapContractCode
, mapEntriesOrdered
, pattern CAR
, pattern CDR
, pattern PAIR
, pattern UNPAIR
, PackedNotes(..)
, ConstraintDIPN
, ConstraintDIPN'
, ConstraintDIG
, ConstraintDIG'
, ConstraintDUG
, ConstraintDUG'
) where
import Data.Singletons (Sing)
import Fmt (Buildable(..), (+||), (||+))
import qualified GHC.TypeNats as GHC (Nat)
import qualified Text.Show
import Michelson.Doc
import Michelson.ErrorPos
import Michelson.Printer.Util (RenderDoc(..), buildRenderDoc, needsParens, printDocS)
import Michelson.Typed.Annotation (Notes(..))
import Michelson.Typed.Arith
import Michelson.Typed.Entrypoints
import Michelson.Typed.Polymorphic
import Michelson.Typed.Scope
import Michelson.Typed.Sing (KnownT)
import Michelson.Typed.T (T(..))
import Michelson.Typed.Value (Comparable, ContractInp, ContractOut, Value'(..))
import Michelson.Untyped (Annotation(..), EntriesOrder(..), FieldAnn, TypeAnn, VarAnn, entriesOrderToInt)
import Util.Peano
import Util.TH
import Util.Type (type (++), KnownList)
data PackedNotes a where
PackedNotes :: SingI a => Notes a -> PackedNotes (a ': s)
instance NFData (PackedNotes a) where
rnf :: PackedNotes a -> ()
rnf (PackedNotes n :: Notes a
n) = Notes a -> ()
forall a. NFData a => a -> ()
rnf Notes a
n
instance Show (PackedNotes a) where
show :: PackedNotes a -> String
show = Bool -> Doc -> String
printDocS Bool
True (Doc -> String)
-> (PackedNotes a -> Doc) -> PackedNotes a -> String
forall b c a. (b -> c) -> (a -> b) -> a -> c
. RenderContext -> PackedNotes a -> Doc
forall a. RenderDoc a => RenderContext -> a -> Doc
renderDoc RenderContext
needsParens
instance Buildable (PackedNotes a) where
build :: PackedNotes a -> Builder
build = PackedNotes a -> Builder
forall a. RenderDoc a => a -> Builder
buildRenderDoc
instance RenderDoc (PackedNotes a) where
renderDoc :: RenderContext -> PackedNotes a -> Doc
renderDoc pn :: RenderContext
pn (PackedNotes n :: Notes a
n) = RenderContext -> Notes a -> Doc
forall a. RenderDoc a => RenderContext -> a -> Doc
renderDoc RenderContext
pn Notes a
n
type ConstraintDIPN' kind (n :: Peano) (inp :: [kind])
(out :: [kind]) (s :: [kind]) (s' :: [kind]) =
( SingI n, KnownPeano n, RequireLongerOrSameLength inp n
, ((Take n inp) ++ s) ~ inp
, ((Take n inp) ++ s') ~ out
)
type ConstraintDIPN n inp out s s' = ConstraintDIPN' T n inp out s s'
type ConstraintDIG' kind (n :: Peano) (inp :: [kind])
(out :: [kind]) (a :: kind) =
( SingI n, KnownPeano n, RequireLongerThan inp n
, inp ~ (Take n inp ++ (a ': Drop ('S n) inp))
, out ~ (a ': Take n inp ++ Drop ('S n) inp)
)
type ConstraintDIG n inp out a = ConstraintDIG' T n inp out a
type ConstraintDUG' kind (n :: Peano) (inp :: [kind])
(out :: [kind]) (a :: kind) =
( SingI n, KnownPeano n, RequireLongerThan out n
, inp ~ (a ': Drop ('S 'Z) inp)
, out ~ (Take n (Drop ('S 'Z) inp) ++ (a ': Drop ('S n) inp))
)
type ConstraintDUG n inp out a = ConstraintDUG' T n inp out a
data Instr (inp :: [T]) (out :: [T]) where
WithLoc :: InstrCallStack -> Instr a b -> Instr a b
InstrWithNotes :: PackedNotes b -> Instr a b -> Instr a b
InstrWithVarNotes :: NonEmpty VarAnn -> Instr a b -> Instr a b
FrameInstr
:: forall a b s.
(KnownList a, KnownList b)
=> Proxy s -> Instr a b -> Instr (a ++ s) (b ++ s)
Seq :: Instr a b -> Instr b c -> Instr a c
Nop :: Instr s s
Ext :: ExtInstr s -> Instr s s
Nested :: Instr inp out -> Instr inp out
DocGroup :: DocGrouping -> Instr inp out -> Instr inp out
AnnCAR :: FieldAnn -> Instr ('TPair a b ': s) (a ': s)
AnnCDR :: FieldAnn -> Instr ('TPair a b ': s) (b ': s)
DROP :: Instr (a ': s) s
DROPN
:: forall (n :: Peano) s.
(SingI n, KnownPeano n, RequireLongerOrSameLength s n, NFData (Sing n))
=> Sing n -> Instr s (Drop n s)
DUP :: Instr (a ': s) (a ': a ': s)
SWAP :: Instr (a ': b ': s) (b ': a ': s)
DIG
:: forall (n :: Peano) inp out a. (ConstraintDIG n inp out a, NFData (Sing n))
=> Sing n -> Instr inp out
DUG
:: forall (n :: Peano) inp out a. (ConstraintDUG n inp out a, NFData (Sing n))
=> Sing n -> Instr inp out
PUSH
:: forall t s . ConstantScope t
=> Value' Instr t -> Instr s (t ': s)
SOME :: Instr (a ': s) ('TOption a ': s)
NONE :: forall a s . KnownT a => Instr s ('TOption a ': s)
UNIT :: Instr s ('TUnit ': s)
IF_NONE
:: Instr s s'
-> Instr (a ': s) s'
-> Instr ('TOption a ': s) s'
AnnPAIR :: TypeAnn -> FieldAnn -> FieldAnn -> Instr (a ': b ': s) ('TPair a b ': s)
LEFT :: forall b a s . KnownT b => Instr (a ': s) ('TOr a b ': s)
RIGHT :: forall a b s . KnownT a => Instr (b ': s) ('TOr a b ': s)
IF_LEFT
:: Instr (a ': s) s'
-> Instr (b ': s) s'
-> Instr ('TOr a b ': s) s'
NIL :: KnownT p => Instr s ('TList p ': s)
CONS :: Instr (a ': 'TList a ': s) ('TList a ': s)
IF_CONS
:: Instr (a ': 'TList a ': s) s'
-> Instr s s'
-> Instr ('TList a ': s) s'
SIZE :: SizeOp c => Instr (c ': s) ('TNat ': s)
EMPTY_SET :: (KnownT e, Comparable e) => Instr s ('TSet e ': s)
EMPTY_MAP :: (KnownT a, KnownT b, Comparable a) => Instr s ('TMap a b ': s)
EMPTY_BIG_MAP :: (KnownT a, KnownT b, Comparable a) => Instr s ('TBigMap a b ': s)
MAP :: (MapOp c, KnownT b)
=> Instr (MapOpInp c ': s) (b ': s)
-> Instr (c ': s) (MapOpRes c b ': s)
ITER :: IterOp c => Instr (IterOpEl c ': s) s -> Instr (c ': s) s
MEM :: MemOp c => Instr (MemOpKey c ': c ': s) ('TBool ': s)
GET
:: (GetOp c, KnownT (GetOpVal c))
=> Instr (GetOpKey c ': c ': s) ('TOption (GetOpVal c) ': s)
UPDATE
:: UpdOp c
=> Instr (UpdOpKey c ': UpdOpParams c ': c ': s) (c ': s)
IF :: Instr s s'
-> Instr s s'
-> Instr ('TBool ': s) s'
LOOP :: Instr s ('TBool ': s)
-> Instr ('TBool ': s) s
LOOP_LEFT
:: Instr (a ': s) ('TOr a b ': s)
-> Instr ('TOr a b ': s) (b ': s)
LAMBDA :: forall i o s . (KnownT i, KnownT o)
=> Value' Instr ('TLambda i o) -> Instr s ('TLambda i o ': s)
EXEC :: Instr (t1 ': 'TLambda t1 t2 ': s) (t2 ': s)
APPLY
:: forall a b c s . (ConstantScope a, KnownT b)
=> Instr (a ': 'TLambda ('TPair a b) c ': s) ('TLambda b c ': s)
DIP :: Instr a c -> Instr (b ': a) (b ': c)
DIPN
:: forall (n :: Peano) inp out s s'. (ConstraintDIPN n inp out s s', (NFData (Sing n)))
=> Sing n -> Instr s s' -> Instr inp out
FAILWITH :: (KnownT a) => Instr (a ': s) t
CAST :: forall a s . SingI a => Instr (a ': s) (a ': s)
RENAME :: Instr (a ': s) (a ': s)
PACK :: PackedValScope a => Instr (a ': s) ('TBytes ': s)
UNPACK :: (UnpackedValScope a, KnownT a) => Instr ('TBytes ': s) ('TOption a ': s)
CONCAT :: ConcatOp c => Instr (c ': c ': s) (c ': s)
CONCAT' :: ConcatOp c => Instr ('TList c ': s) (c ': s)
SLICE
:: (SliceOp c, KnownT c)
=> Instr ('TNat ': 'TNat ': c ': s) ('TOption c ': s)
ISNAT :: Instr ('TInt ': s) ('TOption ('TNat) ': s)
ADD
:: (ArithOp Add n m, Typeable n, Typeable m)
=> Instr (n ': m ': s) (ArithRes Add n m ': s)
SUB
:: (ArithOp Sub n m, Typeable n, Typeable m)
=> Instr (n ': m ': s) (ArithRes Sub n m ': s)
MUL
:: (ArithOp Mul n m, Typeable n, Typeable m)
=> Instr (n ': m ': s) (ArithRes Mul n m ': s)
EDIV
:: EDivOp n m
=> Instr (n ': m ': s)
(('TOption ('TPair (EDivOpRes n m)
(EModOpRes n m))) ': s)
ABS
:: UnaryArithOp Abs n
=> Instr (n ': s) (UnaryArithRes Abs n ': s)
NEG
:: UnaryArithOp Neg n
=> Instr (n ': s) (UnaryArithRes Neg n ': s)
LSL
:: (ArithOp Lsl n m, Typeable n, Typeable m)
=> Instr (n ': m ': s) (ArithRes Lsl n m ': s)
LSR
:: (ArithOp Lsr n m, Typeable n, Typeable m)
=> Instr (n ': m ': s) (ArithRes Lsr n m ': s)
OR
:: (ArithOp Or n m, Typeable n, Typeable m)
=> Instr (n ': m ': s) (ArithRes Or n m ': s)
AND
:: (ArithOp And n m, Typeable n, Typeable m)
=> Instr (n ': m ': s) (ArithRes And n m ': s)
XOR
:: (ArithOp Xor n m, Typeable n, Typeable m)
=> Instr (n ': m ': s) (ArithRes Xor n m ': s)
NOT
:: UnaryArithOp Not n
=> Instr (n ': s) (UnaryArithRes Not n ': s)
COMPARE
:: (Comparable n, KnownT n)
=> Instr (n ': n ': s) ('TInt ': s)
EQ
:: UnaryArithOp Eq' n
=> Instr (n ': s) (UnaryArithRes Eq' n ': s)
NEQ
:: UnaryArithOp Neq n
=> Instr (n ': s) (UnaryArithRes Neq n ': s)
LT
:: UnaryArithOp Lt n
=> Instr (n ': s) (UnaryArithRes Lt n ': s)
GT
:: UnaryArithOp Gt n
=> Instr (n ': s) (UnaryArithRes Gt n ': s)
LE
:: UnaryArithOp Le n
=> Instr (n ': s) (UnaryArithRes Le n ': s)
GE
:: UnaryArithOp Ge n
=> Instr (n ': s) (UnaryArithRes Ge n ': s)
INT :: Instr ('TNat ': s) ('TInt ': s)
SELF
:: forall (arg :: T) s .
(ParameterScope arg)
=> SomeEntrypointCallT arg
-> Instr s ('TContract arg ': s)
CONTRACT
:: (ParameterScope p)
=> Notes p
-> EpName
-> Instr ('TAddress ': s) ('TOption ('TContract p) ': s)
TRANSFER_TOKENS
:: (ParameterScope p) =>
Instr (p ': 'TMutez ': 'TContract p ': s)
('TOperation ': s)
SET_DELEGATE
:: Instr ('TOption 'TKeyHash ': s) ('TOperation ': s)
CREATE_CONTRACT
:: (ParameterScope p, StorageScope g)
=> Contract p g
-> Instr ('TOption 'TKeyHash ':
'TMutez ':
g ': s)
('TOperation ': 'TAddress ': s)
IMPLICIT_ACCOUNT
:: Instr ('TKeyHash ': s) ('TContract 'TUnit ': s)
NOW :: Instr s ('TTimestamp ': s)
AMOUNT :: Instr s ('TMutez ': s)
BALANCE :: Instr s ('TMutez ': s)
CHECK_SIGNATURE
:: Instr ('TKey ': 'TSignature ': 'TBytes ': s)
('TBool ': s)
SHA256 :: Instr ('TBytes ': s) ('TBytes ': s)
SHA512 :: Instr ('TBytes ': s) ('TBytes ': s)
BLAKE2B :: Instr ('TBytes ': s) ('TBytes ': s)
HASH_KEY :: Instr ('TKey ': s) ('TKeyHash ': s)
SOURCE :: Instr s ('TAddress ': s)
SENDER :: Instr s ('TAddress ': s)
ADDRESS :: Instr ('TContract a ': s) ('TAddress ': s)
CHAIN_ID :: Instr s ('TChainId ': s)
deriving stock instance Show (Instr inp out)
instance Semigroup (Instr s s) where
<> :: Instr s s -> Instr s s -> Instr s s
(<>) = Instr s s -> Instr s s -> Instr s s
forall (a :: [T]) (b :: [T]) (c :: [T]).
Instr a b -> Instr b c -> Instr a c
Seq
instance Monoid (Instr s s) where
mempty :: Instr s s
mempty = Instr s s
forall (s :: [T]). Instr s s
Nop
pattern CAR :: () => (i ~ ('TPair a b : s), o ~ (a : s)) => Instr i o
pattern $bCAR :: Instr i o
$mCAR :: forall r (i :: [T]) (o :: [T]).
Instr i o
-> (forall (a :: T) (b :: T) (s :: [T]).
(i ~ ('TPair a b : s), o ~ (a : s)) =>
r)
-> (Void# -> r)
-> r
CAR = AnnCAR (AnnotationUnsafe "")
pattern CDR :: () => (i ~ ('TPair a b : s), o ~ (b : s)) => Instr i o
pattern $bCDR :: Instr i o
$mCDR :: forall r (i :: [T]) (o :: [T]).
Instr i o
-> (forall (a :: T) (b :: T) (s :: [T]).
(i ~ ('TPair a b : s), o ~ (b : s)) =>
r)
-> (Void# -> r)
-> r
CDR = AnnCDR (AnnotationUnsafe "")
pattern UNPAIR :: () => (i ~ ('TPair a b : s), o ~ (a : b : s)) => Instr i o
pattern $bUNPAIR :: Instr i o
$mUNPAIR :: forall r (i :: [T]) (o :: [T]).
Instr i o
-> (forall (a :: T) (b :: T) (s :: [T]).
(i ~ ('TPair a b : s), o ~ (a : b : s)) =>
r)
-> (Void# -> r)
-> r
UNPAIR = Seq DUP (Seq CAR (DIP CDR))
pattern PAIR :: () => (i ~ (a ': b ': s), o ~ ('TPair a b ': s)) => Instr i o
pattern $bPAIR :: Instr i o
$mPAIR :: forall r (i :: [T]) (o :: [T]).
Instr i o
-> (forall (a :: T) (b :: T) (s :: [T]).
(i ~ (a : b : s), o ~ ('TPair a b : s)) =>
r)
-> (Void# -> r)
-> r
PAIR = AnnPAIR (AnnotationUnsafe "") (AnnotationUnsafe "") (AnnotationUnsafe "")
data TestAssert (s :: [T]) where
TestAssert
:: (Typeable out)
=> Text
-> PrintComment inp
-> Instr inp ('TBool ': out)
-> TestAssert inp
deriving stock instance Show (TestAssert s)
instance NFData (TestAssert s) where
rnf :: TestAssert s -> ()
rnf (TestAssert a :: Text
a b :: PrintComment s
b c :: Instr s ('TBool : out)
c) = (Text, PrintComment s, Instr s ('TBool : out)) -> ()
forall a. NFData a => a -> ()
rnf (Text
a, PrintComment s
b, Instr s ('TBool : out)
c)
data StackRef (st :: [T]) where
StackRef
:: (KnownPeano idx, SingI idx, RequireLongerThan st idx)
=> Sing (idx :: Peano) -> StackRef st
instance NFData (StackRef st) where
rnf :: StackRef st -> ()
rnf (StackRef s :: Sing idx
s) = SingNat idx -> ()
forall a. NFData a => a -> ()
rnf Sing idx
SingNat idx
s
instance Eq (StackRef st) where
StackRef snat1 :: Sing idx
snat1 == :: StackRef st -> StackRef st -> Bool
== StackRef snat2 :: Sing idx
snat2 = SingNat idx -> Natural
forall (n :: Peano) (proxy :: Peano -> *).
KnownPeano n =>
proxy n -> Natural
peanoVal Sing idx
SingNat idx
snat1 Natural -> Natural -> Bool
forall a. Eq a => a -> a -> Bool
== SingNat idx -> Natural
forall (n :: Peano) (proxy :: Peano -> *).
KnownPeano n =>
proxy n -> Natural
peanoVal Sing idx
SingNat idx
snat2
instance Show (StackRef st) where
show :: StackRef st -> String
show (StackRef snat :: Sing idx
snat) = "StackRef {" Builder -> Builder -> String
forall b. FromBuilder b => Builder -> Builder -> b
+|| SingNat idx -> Natural
forall (n :: Peano) (proxy :: Peano -> *).
KnownPeano n =>
proxy n -> Natural
peanoVal Sing idx
SingNat idx
snat Natural -> Builder -> Builder
forall a b. (Show a, FromBuilder b) => a -> Builder -> b
||+ "}"
mkStackRef
:: forall (gn :: GHC.Nat) st n.
(n ~ ToPeano gn, SingI n, KnownPeano n, RequireLongerThan st n)
=> StackRef st
mkStackRef :: StackRef st
mkStackRef = Sing n -> StackRef st
forall (idx :: Peano) (st :: [T]).
(KnownPeano idx, SingI idx, RequireLongerThan st idx) =>
Sing idx -> StackRef st
StackRef (Sing n -> StackRef st) -> Sing n -> StackRef st
forall a b. (a -> b) -> a -> b
$ SingI (ToPeano gn) => Sing (ToPeano gn)
forall k (a :: k). SingI a => Sing a
sing @(ToPeano gn)
newtype (st :: [T]) =
{ :: [Either Text (StackRef st)]
} deriving stock (PrintComment st -> PrintComment st -> Bool
(PrintComment st -> PrintComment st -> Bool)
-> (PrintComment st -> PrintComment st -> Bool)
-> Eq (PrintComment st)
forall (st :: [T]). PrintComment st -> PrintComment st -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PrintComment st -> PrintComment st -> Bool
$c/= :: forall (st :: [T]). PrintComment st -> PrintComment st -> Bool
== :: PrintComment st -> PrintComment st -> Bool
$c== :: forall (st :: [T]). PrintComment st -> PrintComment st -> Bool
Eq, Int -> PrintComment st -> ShowS
[PrintComment st] -> ShowS
PrintComment st -> String
(Int -> PrintComment st -> ShowS)
-> (PrintComment st -> String)
-> ([PrintComment st] -> ShowS)
-> Show (PrintComment st)
forall (st :: [T]). Int -> PrintComment st -> ShowS
forall (st :: [T]). [PrintComment st] -> ShowS
forall (st :: [T]). PrintComment st -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PrintComment st] -> ShowS
$cshowList :: forall (st :: [T]). [PrintComment st] -> ShowS
show :: PrintComment st -> String
$cshow :: forall (st :: [T]). PrintComment st -> String
showsPrec :: Int -> PrintComment st -> ShowS
$cshowsPrec :: forall (st :: [T]). Int -> PrintComment st -> ShowS
Show, (forall x. PrintComment st -> Rep (PrintComment st) x)
-> (forall x. Rep (PrintComment st) x -> PrintComment st)
-> Generic (PrintComment st)
forall (st :: [T]) x. Rep (PrintComment st) x -> PrintComment st
forall (st :: [T]) x. PrintComment st -> Rep (PrintComment st) x
forall x. Rep (PrintComment st) x -> PrintComment st
forall x. PrintComment st -> Rep (PrintComment st) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall (st :: [T]) x. Rep (PrintComment st) x -> PrintComment st
$cfrom :: forall (st :: [T]) x. PrintComment st -> Rep (PrintComment st) x
Generic)
deriving newtype (b -> PrintComment st -> PrintComment st
NonEmpty (PrintComment st) -> PrintComment st
PrintComment st -> PrintComment st -> PrintComment st
(PrintComment st -> PrintComment st -> PrintComment st)
-> (NonEmpty (PrintComment st) -> PrintComment st)
-> (forall b.
Integral b =>
b -> PrintComment st -> PrintComment st)
-> Semigroup (PrintComment st)
forall (st :: [T]). NonEmpty (PrintComment st) -> PrintComment st
forall (st :: [T]).
PrintComment st -> PrintComment st -> PrintComment st
forall (st :: [T]) b.
Integral b =>
b -> PrintComment st -> PrintComment st
forall b. Integral b => b -> PrintComment st -> PrintComment st
forall a.
(a -> a -> a)
-> (NonEmpty a -> a)
-> (forall b. Integral b => b -> a -> a)
-> Semigroup a
stimes :: b -> PrintComment st -> PrintComment st
$cstimes :: forall (st :: [T]) b.
Integral b =>
b -> PrintComment st -> PrintComment st
sconcat :: NonEmpty (PrintComment st) -> PrintComment st
$csconcat :: forall (st :: [T]). NonEmpty (PrintComment st) -> PrintComment st
<> :: PrintComment st -> PrintComment st -> PrintComment st
$c<> :: forall (st :: [T]).
PrintComment st -> PrintComment st -> PrintComment st
Semigroup, Semigroup (PrintComment st)
PrintComment st
Semigroup (PrintComment st) =>
PrintComment st
-> (PrintComment st -> PrintComment st -> PrintComment st)
-> ([PrintComment st] -> PrintComment st)
-> Monoid (PrintComment st)
[PrintComment st] -> PrintComment st
PrintComment st -> PrintComment st -> PrintComment st
forall (st :: [T]). Semigroup (PrintComment st)
forall (st :: [T]). PrintComment st
forall (st :: [T]). [PrintComment st] -> PrintComment st
forall (st :: [T]).
PrintComment st -> PrintComment st -> PrintComment st
forall a.
Semigroup a =>
a -> (a -> a -> a) -> ([a] -> a) -> Monoid a
mconcat :: [PrintComment st] -> PrintComment st
$cmconcat :: forall (st :: [T]). [PrintComment st] -> PrintComment st
mappend :: PrintComment st -> PrintComment st -> PrintComment st
$cmappend :: forall (st :: [T]).
PrintComment st -> PrintComment st -> PrintComment st
mempty :: PrintComment st
$cmempty :: forall (st :: [T]). PrintComment st
$cp1Monoid :: forall (st :: [T]). Semigroup (PrintComment st)
Monoid)
instance NFData (PrintComment st)
instance IsString (PrintComment st) where
fromString :: String -> PrintComment st
fromString = [Either Text (StackRef st)] -> PrintComment st
forall (st :: [T]). [Either Text (StackRef st)] -> PrintComment st
PrintComment ([Either Text (StackRef st)] -> PrintComment st)
-> (String -> [Either Text (StackRef st)])
-> String
-> PrintComment st
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Either Text (StackRef st) -> [Either Text (StackRef st)]
forall x. One x => OneItem x -> x
one (Either Text (StackRef st) -> [Either Text (StackRef st)])
-> (String -> Either Text (StackRef st))
-> String
-> [Either Text (StackRef st)]
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> Either Text (StackRef st)
forall a b. a -> Either a b
Left (Text -> Either Text (StackRef st))
-> (String -> Text) -> String -> Either Text (StackRef st)
forall b c a. (b -> c) -> (a -> b) -> a -> c
. String -> Text
forall a. IsString a => String -> a
fromString
data
= FunctionStarts Text
| FunctionEnds Text
| StatementStarts Text
| StatementEnds Text
| Text
deriving stock (Int -> CommentType -> ShowS
[CommentType] -> ShowS
CommentType -> String
(Int -> CommentType -> ShowS)
-> (CommentType -> String)
-> ([CommentType] -> ShowS)
-> Show CommentType
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [CommentType] -> ShowS
$cshowList :: [CommentType] -> ShowS
show :: CommentType -> String
$cshow :: CommentType -> String
showsPrec :: Int -> CommentType -> ShowS
$cshowsPrec :: Int -> CommentType -> ShowS
Show, (forall x. CommentType -> Rep CommentType x)
-> (forall x. Rep CommentType x -> CommentType)
-> Generic CommentType
forall x. Rep CommentType x -> CommentType
forall x. CommentType -> Rep CommentType x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep CommentType x -> CommentType
$cfrom :: forall x. CommentType -> Rep CommentType x
Generic)
instance NFData CommentType
data ExtInstr s
= TEST_ASSERT (TestAssert s)
| PRINT (PrintComment s)
| DOC_ITEM SomeDocItem
| CommentType
deriving stock (Int -> ExtInstr s -> ShowS
[ExtInstr s] -> ShowS
ExtInstr s -> String
(Int -> ExtInstr s -> ShowS)
-> (ExtInstr s -> String)
-> ([ExtInstr s] -> ShowS)
-> Show (ExtInstr s)
forall (s :: [T]). Int -> ExtInstr s -> ShowS
forall (s :: [T]). [ExtInstr s] -> ShowS
forall (s :: [T]). ExtInstr s -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ExtInstr s] -> ShowS
$cshowList :: forall (s :: [T]). [ExtInstr s] -> ShowS
show :: ExtInstr s -> String
$cshow :: forall (s :: [T]). ExtInstr s -> String
showsPrec :: Int -> ExtInstr s -> ShowS
$cshowsPrec :: forall (s :: [T]). Int -> ExtInstr s -> ShowS
Show, (forall x. ExtInstr s -> Rep (ExtInstr s) x)
-> (forall x. Rep (ExtInstr s) x -> ExtInstr s)
-> Generic (ExtInstr s)
forall (s :: [T]) x. Rep (ExtInstr s) x -> ExtInstr s
forall (s :: [T]) x. ExtInstr s -> Rep (ExtInstr s) x
forall x. Rep (ExtInstr s) x -> ExtInstr s
forall x. ExtInstr s -> Rep (ExtInstr s) x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall (s :: [T]) x. Rep (ExtInstr s) x -> ExtInstr s
$cfrom :: forall (s :: [T]) x. ExtInstr s -> Rep (ExtInstr s) x
Generic)
instance NFData (ExtInstr s)
type ContractCode cp st = Instr (ContractInp cp st) (ContractOut st)
data Contract cp st = (ParameterScope cp, StorageScope st) => Contract
{ Contract cp st -> ContractCode cp st
cCode :: ContractCode cp st
, Contract cp st -> ParamNotes cp
cParamNotes :: ParamNotes cp
, Contract cp st -> Notes st
cStoreNotes :: Notes st
, Contract cp st -> EntriesOrder
cEntriesOrder :: EntriesOrder
}
deriving stock instance Show (Contract cp st)
deriving stock instance Eq (ContractCode cp st) => Eq (Contract cp st)
instance NFData (Contract cp st) where
rnf :: Contract cp st -> ()
rnf (Contract a :: ContractCode cp st
a b :: ParamNotes cp
b c :: Notes st
c d :: EntriesOrder
d) = (ContractCode cp st, ParamNotes cp, Notes st, EntriesOrder) -> ()
forall a. NFData a => a -> ()
rnf (ContractCode cp st
a, ParamNotes cp
b, Notes st
c, EntriesOrder
d)
mapContractCode
:: (ContractCode cp st -> ContractCode cp st)
-> Contract cp st
-> Contract cp st
mapContractCode :: (ContractCode cp st -> ContractCode cp st)
-> Contract cp st -> Contract cp st
mapContractCode f :: ContractCode cp st -> ContractCode cp st
f contract :: Contract cp st
contract = Contract cp st
contract { cCode :: ContractCode cp st
cCode = ContractCode cp st -> ContractCode cp st
f (ContractCode cp st -> ContractCode cp st)
-> ContractCode cp st -> ContractCode cp st
forall a b. (a -> b) -> a -> b
$ Contract cp st -> ContractCode cp st
forall (cp :: T) (st :: T). Contract cp st -> ContractCode cp st
cCode Contract cp st
contract }
mapEntriesOrdered
:: Contract cp st
-> (ParamNotes cp -> a)
-> (Notes st -> a)
-> (ContractCode cp st -> a)
-> [a]
mapEntriesOrdered :: Contract cp st
-> (ParamNotes cp -> a)
-> (Notes st -> a)
-> (ContractCode cp st -> a)
-> [a]
mapEntriesOrdered Contract{..} fParam :: ParamNotes cp -> a
fParam fStorage :: Notes st -> a
fStorage fCode :: ContractCode cp st -> a
fCode =
((Int, a) -> a) -> [(Int, a)] -> [a]
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
fmap (Int, a) -> a
forall a b. (a, b) -> b
snd
([(Int, a)] -> [a]) -> [(Int, a)] -> [a]
forall a b. (a -> b) -> a -> b
$ ((Int, a) -> Int) -> [(Int, a)] -> [(Int, a)]
forall b a. Ord b => (a -> b) -> [a] -> [a]
sortWith (Int, a) -> Int
forall a b. (a, b) -> a
fst
[ (Int
paramPos, ParamNotes cp -> a
fParam ParamNotes cp
cParamNotes)
, (Int
storagePos, Notes st -> a
fStorage Notes st
cStoreNotes)
, (Int
codePos, ContractCode cp st -> a
fCode ContractCode cp st
cCode)
]
where
(paramPos :: Int
paramPos, storagePos :: Int
storagePos, codePos :: Int
codePos) = EntriesOrder -> (Int, Int, Int)
entriesOrderToInt EntriesOrder
cEntriesOrder
$(deriveGADTNFData ''Instr)