Skip to content

Instantly share code, notes, and snippets.

@j-mueller
Created November 14, 2019 15:44
Show Gist options
  • Save j-mueller/550cb1ef8165132d62c473e6c607fa82 to your computer and use it in GitHub Desktop.
Save j-mueller/550cb1ef8165132d62c473e6c607fa82 to your computer and use it in GitHub Desktop.
Vesting (new playground)
{-# LANGUAGE FlexibleContexts #-}
-- A game with two players. Player 1 thinks of a secret word
-- and uses its hash, and the game validator script, to lock
-- some funds (the prize) in a pay-to-script transaction output.
-- Player 2 guesses the word by attempting to spend the transaction
-- output. If the guess is correct, the validator script releases the funds.
-- If it isn't, the funds stay locked.
import Control.Applicative ((<|>), Applicative(..))
import Control.Lens
import Control.Monad (when, void)
import Control.Monad.Except (throwError)
import Data.Foldable (fold)
import qualified Data.ByteString.Lazy.Char8 as C
import qualified Language.PlutusTx as PlutusTx
import qualified Data.Text as T
import Language.PlutusTx.Prelude hiding (fold, pure, (<$>))
import Ledger (Address, DataScript (DataScript), PendingTx,
RedeemerScript (RedeemerScript), ValidatorScript, mkValidatorScript, scriptAddress, Slot(..), PubKey, TxOut)
import Ledger.Ada (Ada)
import qualified Ledger.AddressMap as AM
import qualified Ledger.Ada as Ada
import Ledger.Typed.Scripts (wrapValidator)
import qualified Ledger.Interval as Interval
import Language.Plutus.Contract.Tx
import qualified Language.Plutus.Contract.Tx as Tx
import qualified Language.Plutus.Contract.Typed.Tx as Typed
import Language.Plutus.Contract hiding (when)
import qualified Ledger.Typed.Scripts as Scripts
import Playground.Contract
import Prelude (Eq, Ord, Show)
import Ledger.Value (Value)
import qualified Ledger.Value as Value
import qualified Ledger.Validation as Validation
import Ledger.Validation (PendingTx, PendingTx' (..))
import qualified Ledger.Slot as Slot
import Wallet.Emulator.Types (walletPubKey)
------------------------------------------------------------
type VestingSchema =
BlockchainActions
.\/ Endpoint "vest funds" ()
.\/ Endpoint "retrieve funds" Value
-- | Tranche of a vesting scheme.
data VestingTranche = VestingTranche {
vestingTrancheDate :: Slot,
vestingTrancheAmount :: Value
} deriving Generic
PlutusTx.makeLift ''VestingTranche
-- | A vesting scheme consisting of two tranches. Each tranche defines a date
-- (slot) after which an additional amount can be spent.
data VestingParams = VestingParams {
vestingTranche1 :: VestingTranche,
vestingTranche2 :: VestingTranche,
vestingOwner :: PubKey
} 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 slot range.
availableFrom :: VestingTranche -> Slot.SlotRange -> 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 slot 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 -> Slot -> 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 -> Slot.SlotRange -> Value
remainingFrom t@VestingTranche{vestingTrancheAmount} range =
vestingTrancheAmount - availableFrom t range
{-# INLINABLE validate #-}
validate :: VestingParams -> () -> () -> PendingTx -> Bool
validate VestingParams{vestingTranche1, vestingTranche2, vestingOwner} () () ptx@PendingTx{pendingTxValidRange} =
let
remainingActual = Validation.valueLockedBy ptx (Validation.ownHash ptx)
remainingExpected =
remainingFrom vestingTranche1 pendingTxValidRange
+ remainingFrom vestingTranche2 pendingTxValidRange
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 ptx vestingOwner
-- That way the recipient of the funds can pay them to whatever address they
-- please, potentially saving one transaction.
data Vesting
instance Scripts.ScriptType Vesting where
type instance RedeemerType Vesting = ()
type instance DataType Vesting = ()
vestingScript :: VestingParams -> ValidatorScript
vestingScript = Scripts.validatorScript . scriptInstance
scriptInstance :: VestingParams -> Scripts.ScriptInstance Vesting
scriptInstance vesting = Scripts.Validator @Vesting
($$(PlutusTx.compile [|| validate ||]) `PlutusTx.applyCode` PlutusTx.liftCode vesting)
$$(PlutusTx.compile [|| wrap ||])
where
wrap = Scripts.wrapValidator @() @()
contractAddress :: VestingParams -> Ledger.Address
contractAddress = Scripts.scriptAddress . scriptInstance
vestingContract :: VestingParams -> Contract VestingSchema T.Text ()
vestingContract vesting = vest <|> retrieve where
retrieve = do
payment <- endpoint @"retrieve funds"
liveness <- retrieveFundsC vesting payment
case liveness of
Alive -> retrieve
Dead -> pure ()
vest = endpoint @"vest funds" >> vestFundsC vesting
payIntoContract :: VestingParams -> Value -> TxOut
payIntoContract vp value =
Tx.scriptTxOut'
value
(contractAddress vp)
(DataScript (PlutusTx.toData ()))
vestFundsC
:: ( HasWriteTx s
)
=> VestingParams
-> Contract s T.Text ()
vestFundsC vesting = do
let tx = unbalancedTx [] [payIntoContract vesting (totalAmount vesting)]
void $ writeTxSuccess tx
data Liveness = Alive | Dead
retrieveFundsC
:: ( HasAwaitSlot s
, HasUtxoAt s
, HasWriteTx s
)
=> VestingParams
-> Value
-> Contract s T.Text Liveness
retrieveFundsC vesting payment = do
let addr = contractAddress vesting
nextSlot <- awaitSlot 0
unspentOutputs <- utxoAt addr
let
currentlyLocked = fold (AM.values unspentOutputs)
remainingValue = currentlyLocked - payment
mustRemainLocked = totalAmount vesting - availableAt vesting nextSlot
maxPayment = currentlyLocked - mustRemainLocked
when (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 vesting remainingValue]
Dead -> []
tx = Typed.collectFromScript unspentOutputs (scriptInstance vesting) ()
& validityRange .~ Interval.from nextSlot
& requiredSignatures .~ [vestingOwner vesting]
& outputs .~ remainingOutputs
-- 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 $ writeTx tx
return liveness
endpoints :: Contract VestingSchema T.Text ()
endpoints = vestingContract VestingParams{vestingTranche1 = VestingTranche 10 (Ada.lovelaceValueOf 10), vestingTranche2 = VestingTranche 20 (Ada.lovelaceValueOf 10), vestingOwner = walletPubKey (Wallet 1)}
mkSchemaDefinitions ''VestingSchema
Sign up for free to join this conversation on GitHub. Already have an account? Sign in to comment