Skip to content

Commit

Permalink
Proofreading
Browse files Browse the repository at this point in the history
  • Loading branch information
effectfully committed Apr 15, 2021
1 parent c061b67 commit 32b45cd
Show file tree
Hide file tree
Showing 3 changed files with 3 additions and 5 deletions.
3 changes: 1 addition & 2 deletions plutus-core/plc/Main.hs
Expand Up @@ -3,7 +3,6 @@
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TypeApplications #-}

module Main (main) where
Expand Down Expand Up @@ -226,7 +225,7 @@ restrictingbudgetEnormous = flag' (Verbose Cek.restrictingEnormous)
<> help "Run the machine in restricting mode with an enormous budget" )

restrictingbudget :: Parser BudgetMode
restrictingbudget = (\budget -> Verbose $ Cek.restricting $ ExRestrictingBudget budget)
restrictingbudget = Verbose . Cek.restricting . ExRestrictingBudget
<$> option exbudgetReader
( long "restricting"
<> short 'R'
Expand Down
@@ -1,7 +1,6 @@
-- | The API to the CEK machine.

{-# LANGUAGE DataKinds #-}
{-# LANGUAGE RankNTypes #-}
{-# LANGUAGE TypeOperators #-}

module UntypedPlutusCore.Evaluation.Machine.Cek
Expand Down
Expand Up @@ -568,8 +568,8 @@ runCek
-> Bool
-> Term Name uni fun ()
-> (Either (CekEvaluationException uni fun) (Term Name uni fun ()), cost, [String])
runCek runtime getExBudgetInfo emitting term =
runCekM runtime getExBudgetInfo emitting $ do
runCek runtime mode emitting term =
runCekM runtime mode emitting $ do
spendBudget BAST (ExBudget 0 (termAnn memTerm))
computeCek [] mempty memTerm
where
Expand Down

0 comments on commit 32b45cd

Please sign in to comment.