Skip to content

Commit 9690927

Browse files
committed
cosmetics
1 parent a176f78 commit 9690927

File tree

3 files changed

+11
-11
lines changed

3 files changed

+11
-11
lines changed

src/Nix/Atoms.hs

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -45,9 +45,9 @@ atomText :: NAtom -> Text
4545
atomText (NURI t) = t
4646
atomText (NInt i) = pack (show i)
4747
atomText (NFloat f) = pack (showNixFloat f)
48-
where
49-
showNixFloat x
50-
| x `mod'` 1 /= 0 = show x
51-
| otherwise = show (truncate x :: Int)
48+
where
49+
showNixFloat x
50+
| x `mod'` 1 /= 0 = show x
51+
| otherwise = show (truncate x :: Int)
5252
atomText (NBool b) = if b then "true" else "false"
5353
atomText NNull = "null"

src/Nix/Expr/Types.hs

Lines changed: 6 additions & 6 deletions
Original file line numberDiff line numberDiff line change
@@ -8,14 +8,14 @@
88
{-# LANGUAGE FlexibleContexts #-}
99
{-# LANGUAGE FlexibleInstances #-}
1010
{-# LANGUAGE FunctionalDependencies #-}
11-
{-# LANGUAGE GADTs #-}
1211
{-# LANGUAGE LambdaCase #-}
1312
{-# LANGUAGE OverloadedStrings #-}
1413
{-# LANGUAGE RankNTypes #-}
1514
{-# LANGUAGE StandaloneDeriving #-}
1615
{-# LANGUAGE TemplateHaskell #-}
1716
{-# LANGUAGE TypeApplications #-}
1817
{-# LANGUAGE TypeFamilies #-}
18+
{-# LANGUAGE InstanceSigs #-}
1919

2020
{-# OPTIONS_GHC -Wno-orphans #-}
2121
{-# OPTIONS_GHC -Wno-missing-signatures #-}
@@ -27,8 +27,8 @@
2727
module Nix.Expr.Types where
2828

2929
#ifdef MIN_VERSION_serialise
30+
import qualified Codec.Serialise ( Serialise(decode, encode) ) -- For instance implementation function disamburgation
3031
import Codec.Serialise ( Serialise )
31-
import qualified Codec.Serialise as Ser
3232
#endif
3333
import Control.Applicative
3434
import Control.DeepSeq
@@ -348,12 +348,12 @@ data NKeyName r
348348
instance Serialise r => Serialise (NKeyName r)
349349

350350
instance Serialise Pos where
351-
encode x = Ser.encode (unPos x)
352-
decode = mkPos <$> Ser.decode
351+
encode x = Codec.Serialise.encode (unPos x)
352+
decode = mkPos <$> Codec.Serialise.decode
353353

354354
instance Serialise SourcePos where
355-
encode (SourcePos f l c) = Ser.encode f <> Ser.encode l <> Ser.encode c
356-
decode = SourcePos <$> Ser.decode <*> Ser.decode <*> Ser.decode
355+
encode (SourcePos f l c) = Codec.Serialise.encode f <> Codec.Serialise.encode l <> Codec.Serialise.encode c
356+
decode = SourcePos <$> Codec.Serialise.decode <*> Codec.Serialise.decode <*> Codec.Serialise.decode
357357
#endif
358358

359359
instance Hashable Pos where

src/Nix/Standard.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -219,7 +219,7 @@ instance (MonadInstantiate r, MonadInstantiate m) => MonadInstantiate (StandardT
219219
instance (MonadExec r, MonadExec m) => MonadExec (StandardTF r m)
220220
instance (MonadIntrospect r, MonadIntrospect m) => MonadIntrospect (StandardTF r m)
221221

222-
{------------------------------------------------------------------------}
222+
---------------------------------------------------------------------------------
223223

224224
type StandardT m = Fix1T StandardTF m
225225

0 commit comments

Comments
 (0)