Skip to content

Commit

Permalink
clean imports
Browse files Browse the repository at this point in the history
  • Loading branch information
berewt committed Nov 29, 2022
1 parent d9dfc91 commit 492baa3
Show file tree
Hide file tree
Showing 3 changed files with 3 additions and 5 deletions.
Expand Up @@ -28,7 +28,6 @@ import Ledger.Value (TokenName (..), Value (..))
import Ledger.Value qualified as Value
import Plutus.Contract.StateMachine.MintingPolarity (MintingPolarity (..))
import Plutus.Script.Utils.Typed (ScriptContextV1, mkUntypedMintingPolicy)
import Plutus.Script.Utils.V1.Typed.Scripts qualified as Scripts
import Plutus.V1.Ledger.Contexts qualified as V
import PlutusTx qualified
import Prelude qualified as Haskell
Expand Down
5 changes: 2 additions & 3 deletions plutus-script-utils/src/Plutus/Script/Utils/Typed.hs
Expand Up @@ -5,6 +5,8 @@
{-# LANGUAGE TypeFamilies #-}
module Plutus.Script.Utils.Typed (
UntypedValidator
, UntypedMintingPolicy
, UntypedStakeValidator
---
, ValidatorTypes (..)
, TypedValidator (..)
Expand All @@ -23,9 +25,6 @@ module Plutus.Script.Utils.Typed (
, ScriptContext(mkUntypedValidator, mkUntypedStakeValidator, mkUntypedMintingPolicy)
, ScriptContextV1
, ScriptContextV2
, UntypedMintingPolicy
, UntypedStakeValidator
, UntypedValidator
) where

import Cardano.Ledger.Alonzo.Language (Language (PlutusV1, PlutusV2))
Expand Down
Expand Up @@ -22,7 +22,7 @@ import Plutus.V1.Ledger.Contexts (ScriptContext (ScriptContext, scriptContextPur
import Plutus.V1.Ledger.Contexts qualified as PV1
import Plutus.V1.Ledger.Tx (TxOut (TxOut, txOutAddress))
import PlutusTx qualified
import PlutusTx.Prelude (Bool (False), BuiltinData, any, ($), (.), (==))
import PlutusTx.Prelude (Bool (False), any, ($), (.), (==))

-- TODO: we should add a TypedStakeValidator interface here

Expand Down

0 comments on commit 492baa3

Please sign in to comment.