File tree Expand file tree Collapse file tree 9 files changed +4
-22
lines changed
cardano-api/src/Cardano/Api Expand file tree Collapse file tree 9 files changed +4
-22
lines changed Original file line number Diff line number Diff line change 60
60
# Allow snake_case naming in test modules (following Haskell test property convention)
61
61
- ignore : {name: Use camelCase, within: [Test.Cardano.Api.**, Test.Golden.Cardano.Api.**]}
62
62
63
+ - ignore : {name: Eta reduce}
63
64
- ignore : {name: Use + directly}
65
+ - ignore : {name: Use fmap}
64
66
65
67
# Define some custom infix operators
66
68
# - fixity: infixr 3 ~^#^~
Original file line number Diff line number Diff line change 9
9
{-# LANGUAGE TypeApplications #-}
10
10
{-# LANGUAGE TypeFamilies #-}
11
11
12
- {- HLINT ignore "Avoid lambda using `infix`" -}
13
-
14
12
-- | Cardano addresses: payment and stake addresses.
15
13
module Cardano.Api.Address
16
14
( -- * Payment addresses
Original file line number Diff line number Diff line change @@ -82,9 +82,6 @@ import Data.ByteString.Short qualified as SBS
82
82
import Data.Foldable (Foldable (toList ))
83
83
import Data.Text (Text )
84
84
85
- {- HLINT ignore "Use lambda" -}
86
- {- HLINT ignore "Use lambda-case" -}
87
-
88
85
-- ----------------------------------------------------------------------------
89
86
-- Blocks in an era
90
87
--
Original file line number Diff line number Diff line change @@ -57,12 +57,11 @@ import Ouroboros.Consensus.Byron.Ledger.Mempool qualified as Mempool
57
57
58
58
import Data.ByteString (ByteString )
59
59
import Data.ByteString.Lazy qualified as LB
60
+ import Data.Functor (void )
60
61
import Data.Map.Strict qualified as M
61
62
import Data.Word
62
63
import Numeric.Natural
63
64
64
- {- HLINT ignore "Use void" -}
65
-
66
65
-- | Byron era update proposal
67
66
newtype ByronUpdateProposal
68
67
= ByronUpdateProposal { unByronUpdateProposal :: AProposal ByteString }
@@ -193,7 +192,7 @@ instance HasTypeProxy ByronVote where
193
192
proxyToAsType _ = AsByronVote
194
193
195
194
instance SerialiseAsRawBytes ByronVote where
196
- serialiseToRawBytes (ByronVote vote) = Binary. serialize' $ fmap ( const () ) vote
195
+ serialiseToRawBytes (ByronVote vote) = Binary. serialize' $ void vote
197
196
deserialiseFromRawBytes AsByronVote bs =
198
197
let lBs = LB. fromStrict bs
199
198
in case Binary. decodeFull lBs of
Original file line number Diff line number Diff line change 11
11
{-# LANGUAGE TypeApplications #-}
12
12
{-# LANGUAGE TypeOperators #-}
13
13
14
- {- HLINT ignore "Redundant fmap" -}
15
-
16
14
module Cardano.Api.LedgerState
17
15
( -- * Initialization / Accumulation
18
16
envSecurityParam
@@ -996,8 +994,6 @@ extractHistory historySeq =
996
994
getBlockNo :: WithOrigin BlockInMode -> BlockNo
997
995
getBlockNo = Consensus. withOrigin (BlockNo 0 ) (blockNo . toConsensusBlock)
998
996
999
- {- HLINT ignore chainSyncClientPipelinedWithLedgerState "Use fmap" -}
1000
-
1001
997
-- | A history of k (security parameter) recent ledger states. The head is the
1002
998
-- most recent item. Elements are:
1003
999
--
Original file line number Diff line number Diff line change @@ -24,9 +24,6 @@ import Control.Monad.IO.Class
24
24
import Control.Monad.Reader
25
25
import Control.Monad.Trans.Cont
26
26
27
- {- HLINT ignore "Use const" -}
28
- {- HLINT ignore "Use let" -}
29
-
30
27
-- | Monadic type for constructing local state query expressions.
31
28
--
32
29
-- Use 'queryExpr' in a do block to construct queries of this type and convert
Original file line number Diff line number Diff line change 15
15
{-# LANGUAGE TypeOperators #-}
16
16
{-# LANGUAGE UndecidableInstances #-}
17
17
18
- {- HLINT ignore "Avoid lambda using `infix`" -}
19
- {- HLINT ignore "Use section" -}
20
-
21
18
module Cardano.Api.Plutus.Internal.Script
22
19
( -- * Languages
23
20
SimpleScript'
Original file line number Diff line number Diff line change 20
20
{-# OPTIONS_GHC -Wno-orphans #-}
21
21
{-# OPTIONS_GHC -Wno-unrecognised-pragmas #-}
22
22
23
- {-# HLINT ignore "Redundant ==" #-}
24
-
25
23
-- | The various Cardano protocol parameters, including:
26
24
--
27
25
-- * the current values of updatable protocol parameters: 'ProtocolParameters'
Original file line number Diff line number Diff line change 1
1
{-# LANGUAGE DataKinds #-}
2
2
{-# LANGUAGE RankNTypes #-}
3
3
4
- {- HLINT ignore "Eta reduce" -}
5
-
6
4
module Cardano.Api.Tx.Internal.Body.Lens
7
5
( -- * Types
8
6
LedgerTxBody (.. )
You can’t perform that action at this time.
0 commit comments