Skip to content

Commit

Permalink
Take care of compiler warnings
Browse files Browse the repository at this point in the history
  • Loading branch information
lehins committed Dec 15, 2024
1 parent ce9eda2 commit a8c5f1c
Show file tree
Hide file tree
Showing 8 changed files with 22 additions and 7 deletions.
1 change: 1 addition & 0 deletions Color/src/Graphics/Color/Adaptation/Internal.hs
Original file line number Diff line number Diff line change
Expand Up @@ -4,6 +4,7 @@
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
-- |
-- Module : Graphics.Color.Adaptation.Internal
-- Copyright : (c) Alexey Kuleshevich 2019-2020
Expand Down
6 changes: 6 additions & 0 deletions Color/src/Graphics/Color/Adaptation/VonKries.hs
Original file line number Diff line number Diff line change
@@ -1,11 +1,17 @@
{-# LANGUAGE CPP #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE NegativeLiterals #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TypeApplications #-}
{-# LANGUAGE TypeFamilies #-}
#if __GLASGOW_HASKELL__ >= 906
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE PolyKinds #-}
#else
{-# LANGUAGE TypeInType #-}
#endif
-- |
-- Module : Graphics.Color.Adaptation.VonKries
-- Copyright : (c) Alexey Kuleshevich 2018-2020
Expand Down
11 changes: 6 additions & 5 deletions Color/src/Graphics/Color/Model/Internal.hs
Original file line number Diff line number Diff line change
Expand Up @@ -4,6 +4,7 @@
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE UndecidableInstances #-}
-- |
-- Module : Graphics.Color.Model.Internal
Expand Down Expand Up @@ -43,7 +44,7 @@ module Graphics.Color.Model.Internal
, VU.Vector(V_Color)
) where

import Control.Applicative
import qualified Control.Applicative as A
import Control.DeepSeq (NFData(rnf), deepseq)
import Data.Default.Class (Default(..))
import Data.Foldable
Expand Down Expand Up @@ -94,11 +95,11 @@ instance ColorModel cs e => Default (Color cs e) where


instance ColorModel cs e => Num (Color cs e) where
(+) = liftA2 (+)
(+) = A.liftA2 (+)
{-# INLINE (+) #-}
(-) = liftA2 (-)
(-) = A.liftA2 (-)
{-# INLINE (-) #-}
(*) = liftA2 (*)
(*) = A.liftA2 (*)
{-# INLINE (*) #-}
abs = fmap abs
{-# INLINE abs #-}
Expand All @@ -109,7 +110,7 @@ instance ColorModel cs e => Num (Color cs e) where


instance (ColorModel cs e, Fractional e) => Fractional (Color cs e) where
(/) = liftA2 (/)
(/) = A.liftA2 (/)
{-# INLINE (/) #-}
recip = fmap recip
{-# INLINE recip #-}
Expand Down
1 change: 0 additions & 1 deletion Color/src/Graphics/Color/Space/DIN99.hs
Original file line number Diff line number Diff line change
Expand Up @@ -25,7 +25,6 @@ import GHC.Generics (Generic)
import Graphics.Color.Model.Internal
import Graphics.Color.Space.Internal
import Graphics.Color.Space.CIE1976.LAB
import Graphics.Color.Illuminant.Wikipedia as W

data DIN99 (i :: k)

Expand Down
1 change: 1 addition & 0 deletions Color/src/Graphics/Color/Space/Internal.hs
Original file line number Diff line number Diff line change
Expand Up @@ -11,6 +11,7 @@
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE StandaloneDeriving #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE UndecidableInstances #-}
{-# LANGUAGE ViewPatterns #-}
-- |
Expand Down
6 changes: 6 additions & 0 deletions Color/src/Graphics/Color/Standard/RAL.hs
Original file line number Diff line number Diff line change
@@ -1,10 +1,16 @@
{-# LANGUAGE CPP #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE NegativeLiterals #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TypeFamilies #-}
#if __GLASGOW_HASKELL__ >= 906
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE PolyKinds #-}
#else
{-# LANGUAGE TypeInType #-}
#endif
-- |
-- Module : Graphics.Color.Standard.RAL
-- Copyright : (c) Alexey Kuleshevich 2019-2020
Expand Down
1 change: 1 addition & 0 deletions Color/src/Graphics/Pixel/ColorSpace.hs
Original file line number Diff line number Diff line change
Expand Up @@ -4,6 +4,7 @@
{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE UndecidableInstances #-}
{-# LANGUAGE ViewPatterns #-}
-- |
Expand Down
2 changes: 1 addition & 1 deletion stack.yaml
Original file line number Diff line number Diff line change
@@ -1,4 +1,4 @@
resolver: lts-18.28
resolver: lts-23.00
packages:
- Color
extra-deps: []

0 comments on commit a8c5f1c

Please sign in to comment.