Skip to content

Commit

Permalink
ormolu
Browse files Browse the repository at this point in the history
  • Loading branch information
polinavino committed Jan 5, 2021
1 parent 9cb6f8a commit 643f134
Show file tree
Hide file tree
Showing 4 changed files with 7 additions and 7 deletions.
1 change: 1 addition & 0 deletions alonzo/impl/Setup.hs
Original file line number Diff line number Diff line change
@@ -1,2 +1,3 @@
import Distribution.Simple

main = defaultMain
4 changes: 2 additions & 2 deletions alonzo/impl/src/Cardano/Ledger/Alonzo/PParams.hs
Original file line number Diff line number Diff line change
Expand Up @@ -4,13 +4,13 @@
{-# LANGUAGE DerivingStrategies #-}
{-# LANGUAGE DerivingVia #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE StandaloneDeriving #-}
{-# LANGUAGE TemplateHaskell #-}
{-# LANGUAGE TypeApplications #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}

-- | This module contains just the type of protocol parameters.
module Cardano.Ledger.Alonzo.PParams
Expand All @@ -36,9 +36,9 @@ import Cardano.Binary
encodeWord,
)
import qualified Cardano.Crypto.Hash as Hash
import Cardano.Ledger.Alonzo.Scripts
import Cardano.Ledger.Crypto (HASH)
import qualified Cardano.Ledger.Crypto as CC
import Cardano.Ledger.Alonzo.Scripts
import Cardano.Ledger.Era
import Control.DeepSeq (NFData)
import Control.Monad (unless)
Expand Down
2 changes: 1 addition & 1 deletion alonzo/impl/src/Cardano/Ledger/Alonzo/TxBody.hs
Original file line number Diff line number Diff line change
Expand Up @@ -39,6 +39,7 @@ where

import Cardano.Binary (FromCBOR (..), ToCBOR (..))
import Cardano.Ledger.Alonzo.Data (DataHash)
import Cardano.Ledger.Alonzo.PParams (PPHash (..))
import Cardano.Ledger.Alonzo.Scripts (ExUnits)
import Cardano.Ledger.Alonzo.TxWitness (ScriptDataHash)
import Cardano.Ledger.AuxiliaryData (AuxiliaryDataHash)
Expand Down Expand Up @@ -77,7 +78,6 @@ import Shelley.Spec.Ledger.CompactAddr (CompactAddr, compactAddr, decompactAddr)
import Shelley.Spec.Ledger.Delegation.Certificates (DCert)
import Shelley.Spec.Ledger.Hashing
import Shelley.Spec.Ledger.PParams (Update)
import Cardano.Ledger.Alonzo.PParams (PPHash(..))
import Shelley.Spec.Ledger.TxBody (TxId, Wdrl (Wdrl), unWdrl)

-- | Tag indicating whether an input should be used to pay transaction fees.
Expand Down
Original file line number Diff line number Diff line change
Expand Up @@ -13,6 +13,7 @@ module Test.Cardano.Ledger.Alonzo.Serialisation.Generators where

import Cardano.Ledger.Alonzo (AlonzoEra)
import Cardano.Ledger.Alonzo.Data (Data (..), DataHash (..))
import Cardano.Ledger.Alonzo.PParams (PPHash (..))
import Cardano.Ledger.Alonzo.Scripts
import Cardano.Ledger.Alonzo.Tx
import Cardano.Ledger.Alonzo.TxBody
Expand All @@ -24,14 +25,12 @@ import Cardano.Ledger.Alonzo.TxBody
import Cardano.Ledger.Alonzo.TxWitness
import qualified Cardano.Ledger.Core as Core
import qualified Cardano.Ledger.Crypto as CC
import Cardano.Ledger.Era (Era, Crypto)
import Cardano.Ledger.Shelley.Constraints (UsesScript)
import Cardano.Ledger.Era (Crypto, Era)
import Cardano.Ledger.Shelley.Constraints (UsesScript, UsesValue)
import Test.Cardano.Ledger.ShelleyMA.Serialisation.Generators (genMintValues)
import Test.QuickCheck
import Test.Shelley.Spec.Ledger.ConcreteCryptoTypes (Mock)
import Test.Shelley.Spec.Ledger.Serialisation.EraIndepGenerators ()
import Cardano.Ledger.Alonzo.PParams (PPHash(..))
import Cardano.Ledger.Shelley.Constraints (UsesValue)

-- TODO correct arbitrary generator for Data
instance Arbitrary (Data era) where
Expand Down

0 comments on commit 643f134

Please sign in to comment.