Skip to content

Commit

Permalink
Revert "Merge pull request #141 from mlabs-haskell/mitch/error-messages"
Browse files Browse the repository at this point in the history
This reverts commit 11db995, reversing
changes made to f93927c.
  • Loading branch information
mikekeke committed Aug 25, 2022
1 parent 11db995 commit 28b107d
Show file tree
Hide file tree
Showing 3 changed files with 98 additions and 116 deletions.
56 changes: 27 additions & 29 deletions src/BotPlutusInterface/Balance.hs
Original file line number Diff line number Diff line change
Expand Up @@ -36,7 +36,7 @@ import Cardano.Api.Shelley (ProtocolParameters (protocolParamPrices))
import Control.Monad (foldM, void, zipWithM)
import Control.Monad.Freer (Eff, Member)
import Control.Monad.Trans.Class (lift)
import Control.Monad.Trans.Either (EitherT, firstEitherT, hoistEither, newEitherT, runEitherT)
import Control.Monad.Trans.Either (EitherT, hoistEither, newEitherT, runEitherT)
import Control.Monad.Trans.Except (throwE)
import Data.Bifunctor (bimap)
import Data.Coerce (coerce)
Expand All @@ -52,10 +52,12 @@ import Data.Text qualified as Text
import GHC.Real (Ratio ((:%)))
import Ledger qualified
import Ledger.Ada qualified as Ada
import Ledger.Address (Address (..), PaymentPubKeyHash (PaymentPubKeyHash))
import Ledger.Address (Address (..))
import Ledger.Constraints.OffChain (UnbalancedTx (..))
import Ledger.Crypto (PubKeyHash)
import Ledger.Interval (
Extended (Finite, NegInf, PosInf),
Interval (Interval),
LowerBound (LowerBound),
UpperBound (UpperBound),
)
Expand All @@ -69,15 +71,13 @@ import Ledger.Tx (
TxOutRef (..),
)
import Ledger.Tx qualified as Tx
import Ledger.Tx.CardanoAPI (ToCardanoError (InvalidValidityRange))
import Ledger.Value (Value)
import Ledger.Value qualified as Value
import Plutus.V1.Ledger.Api (
CurrencySymbol (..),
TokenName (..),
)
import Prettyprinter (pretty, viaShow, (<+>))
import Wallet.API as WAPI
import Prelude

-- Config for balancing a `Tx`.
Expand All @@ -101,7 +101,7 @@ balanceTxIO ::
PABConfig ->
PubKeyHash ->
UnbalancedTx ->
Eff effs (Either WAPI.WalletAPIError Tx)
Eff effs (Either Text Tx)
balanceTxIO = balanceTxIO' @w defaultBalanceConfig

-- | `balanceTxIO'` is more flexible version of `balanceTxIO`, this let us specify custom `BalanceConfig`.
Expand All @@ -112,12 +112,12 @@ balanceTxIO' ::
PABConfig ->
PubKeyHash ->
UnbalancedTx ->
Eff effs (Either WAPI.WalletAPIError Tx)
Eff effs (Either Text Tx)
balanceTxIO' balanceCfg pabConf ownPkh unbalancedTx =
runEitherT $
do
(utxos, mcollateral) <- newEitherT $ utxosAndCollateralAtAddress @w balanceCfg pabConf changeAddr
privKeys <- firstEitherT WAPI.OtherError $ newEitherT $ Files.readPrivateKeys @w pabConf
privKeys <- newEitherT $ Files.readPrivateKeys @w pabConf

let utxoIndex :: Map TxOutRef TxOut
utxoIndex = fmap Tx.toTxOut utxos <> unBalancedTxUtxoIndex unbalancedTx
Expand All @@ -142,7 +142,7 @@ balanceTxIO' balanceCfg pabConf ownPkh unbalancedTx =
if bcHasScripts balanceCfg
then
maybe
(throwE $ WAPI.OtherError "Tx uses script but no collateral was provided.")
(throwE "Tx uses script but no collateral was provided.")
(hoistEither . addSignatories ownPkh privKeys requiredSigs . flip addTxCollaterals tx)
mcollateral
else hoistEither $ addSignatories ownPkh privKeys requiredSigs tx
Expand Down Expand Up @@ -189,13 +189,12 @@ balanceTxIO' balanceCfg pabConf ownPkh unbalancedTx =
Map PubKeyHash DummyPrivKey ->
[(TxOut, Integer)] ->
Tx ->
EitherT WAPI.WalletAPIError (Eff effs) (Tx, [(TxOut, Integer)])
EitherT Text (Eff effs) (Tx, [(TxOut, Integer)])
balanceTxLoop utxoIndex privKeys prevMinUtxos tx = do
void $ lift $ Files.writeAll @w pabConf tx
nextMinUtxos <-
firstEitherT WAPI.OtherError $
newEitherT $
calculateMinUtxos @w pabConf (Tx.txData tx) $ Tx.txOutputs tx \\ map fst prevMinUtxos
newEitherT $
calculateMinUtxos @w pabConf (Tx.txData tx) $ Tx.txOutputs tx \\ map fst prevMinUtxos

let minUtxos = prevMinUtxos ++ nextMinUtxos

Expand All @@ -205,9 +204,9 @@ balanceTxIO' balanceCfg pabConf ownPkh unbalancedTx =
txWithoutFees <-
newEitherT $ balanceTxStep @w balanceCfg minUtxos utxoIndex changeAddr $ tx `withFee` 0

exBudget <- firstEitherT WAPI.OtherError $ newEitherT $ BodyBuilder.buildAndEstimateBudget @w pabConf privKeys txWithoutFees
exBudget <- newEitherT $ BodyBuilder.buildAndEstimateBudget @w pabConf privKeys txWithoutFees

nonBudgettedFees <- firstEitherT WAPI.OtherError $ newEitherT $ CardanoCLI.calculateMinFee @w pabConf txWithoutFees
nonBudgettedFees <- newEitherT $ CardanoCLI.calculateMinFee @w pabConf txWithoutFees

let fees = nonBudgettedFees + getBudgetPrice (getExecutionUnitPrices pabConf) exBudget

Expand All @@ -228,10 +227,10 @@ utxosAndCollateralAtAddress ::
BalanceConfig ->
PABConfig ->
Address ->
Eff effs (Either WAPI.WalletAPIError (Map TxOutRef Tx.ChainIndexTxOut, Maybe CollateralUtxo))
Eff effs (Either Text (Map TxOutRef Tx.ChainIndexTxOut, Maybe CollateralUtxo))
utxosAndCollateralAtAddress balanceCfg pabConf changeAddr =
runEitherT $ do
utxos <- firstEitherT WAPI.OtherError $ newEitherT $ CardanoCLI.utxosAt @w pabConf changeAddr
utxos <- newEitherT $ CardanoCLI.utxosAt @w pabConf changeAddr
inMemCollateral <- lift $ getInMemCollateral @w

-- check if `bcHasScripts` is true, if this is the case then we search of
Expand All @@ -240,9 +239,8 @@ utxosAndCollateralAtAddress balanceCfg pabConf changeAddr =
then
maybe
( throwE $
WAPI.OtherError $
"The given transaction uses script, but there's no collateral provided."
<> "This usually means that, we failed to create Tx and update our ContractEnvironment."
"The given transaction uses script, but there's no collateral provided."
<> "This usually means that, we failed to create Tx and update our ContractEnvironment."
)
(const $ pure (removeCollateralFromMap inMemCollateral utxos, inMemCollateral))
inMemCollateral
Expand Down Expand Up @@ -290,7 +288,7 @@ balanceTxStep ::
Map TxOutRef TxOut ->
Address ->
Tx ->
Eff effs (Either WAPI.WalletAPIError Tx)
Eff effs (Either Text Tx)
balanceTxStep balanceCfg minUtxos utxos changeAddr tx =
runEitherT $
(newEitherT . balanceTxIns @w utxos) (addLovelaces minUtxos tx)
Expand Down Expand Up @@ -338,7 +336,7 @@ balanceTxIns ::
Member (PABEffect w) effs =>
Map TxOutRef TxOut ->
Tx ->
Eff effs (Either WAPI.WalletAPIError Tx)
Eff effs (Either Text Tx)
balanceTxIns utxos tx = do
runEitherT $ do
let txOuts = Tx.txOutputs tx
Expand All @@ -348,7 +346,7 @@ balanceTxIns utxos tx = do
[ txFee tx
, nonMintedValue
]
txIns <- firstEitherT WAPI.OtherError $ newEitherT $ selectTxIns @w (txInputs tx) utxos minSpending
txIns <- newEitherT $ selectTxIns @w (txInputs tx) utxos minSpending
pure $ tx {txInputs = txIns <> txInputs tx}

-- | Set collateral or fail in case it's required but not available
Expand All @@ -365,7 +363,7 @@ txUsesScripts Tx {txInputs, txMintScripts} =
(Set.toList txInputs)

-- | Ensures all non ada change goes back to user
handleNonAdaChange :: BalanceConfig -> Address -> Map TxOutRef TxOut -> Tx -> Either WAPI.WalletAPIError Tx
handleNonAdaChange :: BalanceConfig -> Address -> Map TxOutRef TxOut -> Tx -> Either Text Tx
handleNonAdaChange balanceCfg changeAddr utxos tx =
let nonAdaChange = getNonAdaChange utxos tx
predicate =
Expand All @@ -389,7 +387,7 @@ handleNonAdaChange balanceCfg changeAddr utxos tx =
(txOutputs tx)
in if isValueNat nonAdaChange
then Right $ if Value.isZero nonAdaChange then tx else tx {txOutputs = outputs}
else Left $ WAPI.InsufficientFunds "Not enough inputs to balance tokens."
else Left "Not enough inputs to balance tokens."

{- | `addAdaChange` checks if `bcSeparateChange` is true,
if it is then we add the ada change to seperate `TxOut` at changeAddr that contains only ada,
Expand Down Expand Up @@ -433,13 +431,13 @@ addOutput changeAddr tx = tx {txOutputs = txOutputs tx ++ [changeTxOut]}
{- | Add the required signatories to the transaction. Be aware the the signature itself is invalid,
and will be ignored. Only the pub key hashes are used, mapped to signing key files on disk.
-}
addSignatories :: PubKeyHash -> Map PubKeyHash DummyPrivKey -> [PubKeyHash] -> Tx -> Either WAPI.WalletAPIError Tx
addSignatories :: PubKeyHash -> Map PubKeyHash DummyPrivKey -> [PubKeyHash] -> Tx -> Either Text Tx
addSignatories ownPkh privKeys pkhs tx =
foldM
( \tx' pkh ->
case Map.lookup pkh privKeys of
Just privKey -> Right $ Tx.addSignature' (unDummyPrivateKey privKey) tx'
Nothing -> Left $ WAPI.PaymentPrivateKeyNotFound $ PaymentPubKeyHash pkh
Nothing -> Left "Signing key not found."
)
tx
(ownPkh : pkhs)
Expand All @@ -449,13 +447,13 @@ addValidRange ::
Member (PABEffect w) effs =>
POSIXTimeRange ->
Tx ->
Eff effs (Either WAPI.WalletAPIError Tx)
Eff effs (Either Text Tx)
addValidRange timeRange tx =
if validateRange timeRange
then
bimap (WAPI.OtherError . Text.pack . show) (setRange tx)
bimap (Text.pack . show) (setRange tx)
<$> posixTimeRangeToContainedSlotRange @w timeRange
else pure $ Left $ WAPI.ToCardanoError InvalidValidityRange
else pure $ Left "Invalid validity interval."
where
setRange tx' range = tx' {txValidRange = range}

Expand Down
135 changes: 60 additions & 75 deletions src/BotPlutusInterface/CardanoCLI.hs
Original file line number Diff line number Diff line change
Expand Up @@ -142,24 +142,19 @@ calculateMinUtxo ::
Map DatumHash Datum ->
TxOut ->
Eff effs (Either Text Integer)
calculateMinUtxo pabConf datums txOut = do
let outs = txOutOpts pabConf datums [txOut]

case outs of
[] -> pure $ Left "When constructing the transaction, no output values were specified."
_ ->
join
<$> callCommand @w
ShellArgs
{ cmdName = "cardano-cli"
, cmdArgs =
mconcat
[ ["transaction", "calculate-min-required-utxo", "--alonzo-era"]
, outs
, ["--protocol-params-file", pabConf.pcProtocolParamsFile]
]
, cmdOutParser = mapLeft Text.pack . parseOnly UtxoParser.feeParser . Text.pack
}
calculateMinUtxo pabConf datums txOut =
join
<$> callCommand @w
ShellArgs
{ cmdName = "cardano-cli"
, cmdArgs =
mconcat
[ ["transaction", "calculate-min-required-utxo", "--alonzo-era"]
, txOutOpts pabConf datums [txOut]
, ["--protocol-params-file", pabConf.pcProtocolParamsFile]
]
, cmdOutParser = mapLeft Text.pack . parseOnly UtxoParser.feeParser . Text.pack
}

-- | Calculating fee for an unbalanced transaction
calculateMinFee ::
Expand Down Expand Up @@ -196,46 +191,39 @@ buildTx ::
Tx ->
Eff effs (Either Text ExBudget)
buildTx pabConf privKeys txBudget tx = do
let outs = txOutOpts pabConf (txData tx) (txOutputs tx)

case outs of
[] -> pure $ Left "When constructing the transaction, no output values were specified."
_ ->
callCommand @w $ ShellArgs "cardano-cli" opts (const $ valBudget <> mintBudget)
where
(ins, valBudget) = txInOpts (spendBudgets txBudget) pabConf (txInputs tx)
(mints, mintBudget) = mintOpts (mintBudgets txBudget) pabConf (txMintScripts tx) (txRedeemers tx) (txMint tx)

requiredSigners =
concatMap
( \pubKey ->
let pkh = Ledger.pubKeyHash pubKey
in case Map.lookup pkh privKeys of
Just (FromSKey _) ->
["--required-signer", signingKeyFilePath pabConf pkh]
Just (FromVKey _) ->
["--required-signer-hash", encodeByteString $ fromBuiltin $ getPubKeyHash pkh]
Nothing ->
[]
)
(Map.keys (Ledger.txSignatures tx))

opts =
mconcat
[ ["transaction", "build-raw", "--alonzo-era"]
, ins
, txInCollateralOpts (txCollateral tx)
, outs
, mints
, validRangeOpts (txValidRange tx)
, metadataOpts pabConf (txMetadata tx)
, requiredSigners
, ["--fee", showText . getLovelace . fromValue $ txFee tx]
, mconcat
[ ["--protocol-params-file", pabConf.pcProtocolParamsFile]
, ["--out-file", txFilePath pabConf "raw" (txId tx)]
]
let (ins, valBudget) = txInOpts (spendBudgets txBudget) pabConf (txInputs tx)
(mints, mintBudget) = mintOpts (mintBudgets txBudget) pabConf (txMintScripts tx) (txRedeemers tx) (txMint tx)
callCommand @w $ ShellArgs "cardano-cli" (opts ins mints) (const $ valBudget <> mintBudget)
where
requiredSigners =
concatMap
( \pubKey ->
let pkh = Ledger.pubKeyHash pubKey
in case Map.lookup pkh privKeys of
Just (FromSKey _) ->
["--required-signer", signingKeyFilePath pabConf pkh]
Just (FromVKey _) ->
["--required-signer-hash", encodeByteString $ fromBuiltin $ getPubKeyHash pkh]
Nothing ->
[]
)
(Map.keys (Ledger.txSignatures tx))
opts ins mints =
mconcat
[ ["transaction", "build-raw", "--alonzo-era"]
, ins
, txInCollateralOpts (txCollateral tx)
, txOutOpts pabConf (txData tx) (txOutputs tx)
, mints
, validRangeOpts (txValidRange tx)
, metadataOpts pabConf (txMetadata tx)
, requiredSigners
, ["--fee", showText . getLovelace . fromValue $ txFee tx]
, mconcat
[ ["--protocol-params-file", pabConf.pcProtocolParamsFile]
, ["--out-file", txFilePath pabConf "raw" (txId tx)]
]
]

-- Signs and writes a tx (uses the tx body written to disk as input)
signTx ::
Expand Down Expand Up @@ -378,25 +366,22 @@ txOutOpts :: PABConfig -> Map DatumHash Datum -> [TxOut] -> [Text]
txOutOpts pabConf datums =
concatMap
( \TxOut {txOutAddress, txOutValue, txOutDatumHash} ->
if Value.isZero txOutValue
then []
else
mconcat
[
[ "--tx-out"
, Text.intercalate
"+"
[ unsafeSerialiseAddress pabConf.pcNetwork txOutAddress
, valueToCliArg txOutValue
]
mconcat
[
[ "--tx-out"
, Text.intercalate
"+"
[ unsafeSerialiseAddress pabConf.pcNetwork txOutAddress
, valueToCliArg txOutValue
]
, case txOutDatumHash of
Nothing -> []
Just datumHash@(DatumHash dh) ->
if Map.member datumHash datums
then ["--tx-out-datum-embed-file", datumJsonFilePath pabConf datumHash]
else ["--tx-out-datum-hash", encodeByteString $ fromBuiltin dh]
]
]
, case txOutDatumHash of
Nothing -> []
Just datumHash@(DatumHash dh) ->
if Map.member datumHash datums
then ["--tx-out-datum-embed-file", datumJsonFilePath pabConf datumHash]
else ["--tx-out-datum-hash", encodeByteString $ fromBuiltin dh]
]
)

networkOpt :: PABConfig -> [Text]
Expand Down
Loading

0 comments on commit 28b107d

Please sign in to comment.