Created
July 25, 2021 18:45
-
-
Save gregnwosu/4eea7f9b88d10d6fb41b170dfc7784c1 to your computer and use it in GitHub Desktop.
Trying to calculate the total spend for each input pubkeyhash on a Cardaon contract
This file contains bidirectional Unicode text that may be interpreted or compiled differently than what appears below. To review, open the file in an editor that reveals hidden Unicode characters.
Learn more about bidirectional Unicode characters
-- Vesting scheme as a PLC contract | |
import Control.Monad (void, when) | |
import qualified Data.Map as Map | |
import qualified Data.Text as T | |
import Ledger (Address, POSIXTime, POSIXTimeRange, PubKeyHash, Validator, txOutPubKey) | |
import qualified Ledger | |
import qualified Ledger.Ada as Ada | |
import Ledger.Constraints (TxConstraints, mustBeSignedBy, mustPayToTheScript, mustValidateIn) | |
import Ledger.Contexts (ScriptContext (..), TxInfo (..)) | |
import qualified Ledger.Contexts as Validation | |
import qualified Ledger.Interval as Interval | |
import qualified Ledger.TimeSlot as TimeSlot | |
import qualified Ledger.Tx as Tx | |
import qualified Ledger.Typed.Scripts as Scripts | |
import Ledger.Value (Value) | |
import qualified Ledger.Value as Value | |
import Playground.Contract | |
import Plutus.Contract | |
import qualified Plutus.Contract.Typed.Tx as Typed | |
import qualified PlutusTx | |
import PlutusTx.Prelude hiding (Semigroup (..), fold) | |
import Prelude as Haskell (Semigroup (..), show) | |
import Wallet.Emulator.Types (walletPubKey) | |
import qualified PlutusTx.AssocMap as PlutusMap | |
{- | | |
A simple vesting scheme. Money is locked by a contract and may only be | |
retrieved after some time has passed. | |
This is our first example of a contract that covers multiple transactions, | |
with a contract state that changes over time. | |
In our vesting scheme the money will be released in two _tranches_ (parts): | |
A smaller part will be available after an initial number of time has | |
passed, and the entire amount will be released at the end. The owner of the | |
vesting scheme does not have to take out all the money at once: They can | |
take out any amount up to the total that has been released so far. The | |
remaining funds stay locked and can be retrieved later. | |
Let's start with the data types. | |
-} | |
type VestingSchema = | |
Endpoint "vest funds" () | |
.\/ Endpoint "retrieve funds" Value | |
-- | Tranche of a vesting scheme. | |
data VestingTranche = VestingTranche { | |
vestingTrancheDate :: POSIXTime, | |
vestingTrancheAmount :: Value | |
} deriving Generic | |
PlutusTx.makeLift ''VestingTranche | |
-- | A vesting scheme consisting of two tranches. Each tranche defines a date | |
-- (POSIX time) after which an additional amount can be spent. | |
data VestingParams = VestingParams { | |
vestingTranche1 :: VestingTranche, | |
vestingTranche2 :: VestingTranche, | |
vestingOwner :: PubKeyHash | |
} deriving Generic | |
PlutusTx.makeLift ''VestingParams | |
{-# INLINABLE totalAmount #-} | |
-- | The total amount vested | |
totalAmount :: VestingParams -> Value | |
totalAmount VestingParams{vestingTranche1,vestingTranche2} = | |
vestingTrancheAmount vestingTranche1 + vestingTrancheAmount vestingTranche2 | |
{-# INLINABLE availableFrom #-} | |
-- | The amount guaranteed to be available from a given tranche in a given time range. | |
availableFrom :: VestingTranche -> POSIXTimeRange -> Value | |
availableFrom (VestingTranche d v) range = | |
-- The valid range is an open-ended range starting from the tranche vesting date | |
let validRange = Interval.from d | |
-- If the valid range completely contains the argument range (meaning in particular | |
-- that the start time of the argument range is after the tranche vesting date), then | |
-- the money in the tranche is available, otherwise nothing is available. | |
in if validRange `Interval.contains` range then v else zero | |
availableAt :: VestingParams -> POSIXTime -> Value | |
availableAt VestingParams{vestingTranche1, vestingTranche2} sl = | |
let f VestingTranche{vestingTrancheDate, vestingTrancheAmount} = | |
if sl >= vestingTrancheDate then vestingTrancheAmount else mempty | |
in foldMap f [vestingTranche1, vestingTranche2] | |
{-# INLINABLE remainingFrom #-} | |
-- | The amount that has not been released from this tranche yet | |
remainingFrom :: VestingTranche -> POSIXTimeRange -> Value | |
remainingFrom t@VestingTranche{vestingTrancheAmount} range = | |
vestingTrancheAmount - availableFrom t range | |
{-# INLINABLE validate #-} | |
validate :: VestingParams -> () -> () -> ScriptContext -> Bool | |
validate VestingParams{vestingTranche1, vestingTranche2, vestingOwner} () () ctx@ScriptContext{scriptContextTxInfo=txInfo@TxInfo{txInfoValidRange}} = | |
let | |
remainingActual = Validation.valueLockedBy txInfo (Validation.ownHash ctx) | |
remainingExpected = | |
remainingFrom vestingTranche1 txInfoValidRange | |
+ remainingFrom vestingTranche2 txInfoValidRange | |
in remainingActual `Value.geq` remainingExpected | |
-- The policy encoded in this contract | |
-- is "vestingOwner can do with the funds what they want" (as opposed | |
-- to "the funds must be paid to vestingOwner"). This is enforcey by | |
-- the following condition: | |
&& Validation.txSignedBy txInfo vestingOwner | |
-- That way the recipient of the funds can pay them to whatever address they | |
-- please, potentially saving one transaction. | |
data Vesting | |
instance Scripts.ValidatorTypes Vesting where | |
type instance RedeemerType Vesting = () | |
type instance DatumType Vesting = () | |
vestingScript :: VestingParams -> Validator | |
vestingScript = Scripts.validatorScript . typedValidator | |
typedValidator :: VestingParams -> Scripts.TypedValidator Vesting | |
typedValidator = Scripts.mkTypedValidatorParam @Vesting | |
$$(PlutusTx.compile [|| validate ||]) | |
$$(PlutusTx.compile [|| wrap ||]) | |
where | |
wrap = Scripts.wrapValidator | |
calculateTotalSpendForEachPubKeyHash :: [Tx.TxOut] -> Map.Map PubKeyHash Value | |
calculateTotalSpendForEachPubKeyHash = foldr txOutTotalsByPubKeyHash Map.empty | |
where | |
txOutTotalsByPubKeyHash newTxOut accMap = | |
case txOutPubKey newTxOut of | |
Nothing -> accMap | |
(Just newPubKey) -> Map.unionWith (+) accMap (Map.singleton newPubKey (Tx.txOutValue newTxOut)) | |
contractAddress :: VestingParams -> Ledger.Address | |
contractAddress = Scripts.validatorAddress . typedValidator | |
vestingContract :: VestingParams -> Contract () VestingSchema T.Text () | |
vestingContract vesting = vest `select` retrieve | |
where | |
vest = endpoint @"vest funds" >> vestFundsC vesting | |
retrieve = do | |
payment <- endpoint @"retrieve funds" | |
liveness <- retrieveFundsC vesting payment | |
case liveness of | |
Alive -> retrieve | |
Dead -> pure () | |
payIntoContract :: Value -> TxConstraints () () | |
payIntoContract = mustPayToTheScript () | |
vestFundsC | |
:: VestingParams | |
-> Contract () s T.Text () | |
vestFundsC vesting = do | |
let tx = payIntoContract (totalAmount vesting) | |
void $ submitTxConstraints (typedValidator vesting) tx | |
data Liveness = Alive | Dead | |
retrieveFundsC | |
:: VestingParams | |
-> Value | |
-> Contract () s T.Text Liveness | |
retrieveFundsC vesting payment = do | |
let inst = typedValidator vesting | |
addr = Scripts.validatorAddress inst | |
nextTime <- awaitTime 0 | |
unspentOutputs <- utxoAt addr | |
let spendMap = calculateTotalSpendForEachPubKeyHash ( Tx.txOutTxOut . snd <$> (Map.toList unspentOutputs) ) | |
let numSpenders = length (Map.keys spendMap) | |
let | |
currentlyLocked = foldMap (Validation.txOutValue . Tx.txOutTxOut . snd) (Map.toList unspentOutputs) | |
remainingValue = currentlyLocked - payment | |
mustRemainLocked = totalAmount vesting - availableAt vesting nextTime | |
maxPayment = currentlyLocked - mustRemainLocked | |
when (numSpenders < 3 && remainingValue `Value.lt` mustRemainLocked) | |
$ throwError | |
$ T.unwords | |
[ "Cannot take out" | |
, T.pack (show payment) `T.append` "." | |
, "The maximum is" | |
, T.pack (show maxPayment) `T.append` "." | |
, "At least" | |
, T.pack (show mustRemainLocked) | |
, "must remain locked by the script." | |
] | |
let liveness = if remainingValue `Value.gt` mempty then Alive else Dead | |
remainingOutputs = case liveness of | |
Alive -> payIntoContract remainingValue | |
Dead -> mempty | |
tx = Typed.collectFromScript unspentOutputs () | |
<> remainingOutputs | |
<> mustValidateIn (Interval.from nextTime) | |
<> mustBeSignedBy (vestingOwner vesting) | |
-- we don't need to add a pubkey output for 'vestingOwner' here | |
-- because this will be done by the wallet when it balances the | |
-- transaction. | |
void $ submitTxConstraintsSpending inst unspentOutputs tx | |
return liveness | |
endpoints :: Contract () VestingSchema T.Text () | |
endpoints = vestingContract vestingParams | |
where | |
vestingOwner = Ledger.pubKeyHash $ walletPubKey $ Wallet 1 | |
vestingParams = | |
VestingParams {vestingTranche1, vestingTranche2, vestingOwner} | |
vestingTranche1 = | |
VestingTranche | |
{vestingTrancheDate = TimeSlot.slotToPOSIXTime 20, vestingTrancheAmount = Ada.lovelaceValueOf 50_000_000} | |
vestingTranche2 = | |
VestingTranche | |
{vestingTrancheDate = TimeSlot.slotToPOSIXTime 40, vestingTrancheAmount = Ada.lovelaceValueOf 30_000_000} | |
mkSchemaDefinitions ''VestingSchema | |
$(mkKnownCurrencies []) |
Sign up for free
to join this conversation on GitHub.
Already have an account?
Sign in to comment