Skip to content

Commit

Permalink
Fixup haddock
Browse files Browse the repository at this point in the history
  • Loading branch information
lehins committed Jun 22, 2020
1 parent 5aa6d09 commit 6a3932d
Show file tree
Hide file tree
Showing 2 changed files with 14 additions and 14 deletions.
26 changes: 13 additions & 13 deletions Color/src/Graphics/Color/Space/CIE1931/RGB.hs
Expand Up @@ -37,37 +37,37 @@ import Graphics.Color.Illuminant.CIE1931
-- | The original @CIE1931 RGB@ color space with an arbitrary illuminant
data CIERGB (l :: Linearity)

-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
newtype instance Color (CIERGB l) e = CIERGB (Color CM.RGB e)

-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
deriving instance Eq e => Eq (Color (CIERGB l) e)
-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
deriving instance Ord e => Ord (Color (CIERGB l) e)
-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
deriving instance Functor (Color (CIERGB l))
-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
deriving instance Applicative (Color (CIERGB l))
-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
deriving instance Foldable (Color (CIERGB l))
-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
deriving instance Traversable (Color (CIERGB l))
-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
deriving instance Storable e => Storable (Color (CIERGB l) e)

-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
instance (Typeable l, Elevator e) => Show (Color (CIERGB l) e) where
showsPrec _ = showsColorModel

-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
instance (Typeable l, Elevator e) => ColorModel (CIERGB l) e where
type Components (CIERGB l) e = (e, e, e)
toComponents = toComponents . unColorRGB
{-# INLINE toComponents #-}
fromComponents = mkColorRGB . fromComponents
{-# INLINE fromComponents #-}

-- | `CIERGB` linear color space (derived)
-- | `CIERGB` linear color space
instance (Typeable l, Elevator e) => ColorSpace (CIERGB l) 'E e where
type BaseModel (CIERGB l) = CM.RGB
toBaseSpace = id
Expand All @@ -81,15 +81,15 @@ instance (Typeable l, Elevator e) => ColorSpace (CIERGB l) 'E e where
fromColorXYZ xyz = castLinearity (fromRealFloat <$> (xyz2rgbLinear @CIERGB xyz))
{-# INLINE fromColorXYZ #-}

-- | `CIERGB` color space (derived)
-- | `CIERGB` color space
instance RedGreenBlue CIERGB 'E where
gamut = primaries
ecctf = coerce
{-# INLINE ecctf #-}
dcctf = coerce
{-# INLINE dcctf #-}

-- | CIE RGB does not utilize a gamma function, therefore it is safe to cast the
-- | CIE RGB does not utilize any gamma function, therefore it is safe to cast the
-- `Linearity` kind.
--
-- @since 0.2.0
Expand Down
2 changes: 1 addition & 1 deletion Color/src/Graphics/Color/Space/RGB/Derived/CIERGB.hs
Expand Up @@ -89,7 +89,7 @@ instance Illuminant i => RedGreenBlue (CIERGB i) i where
dcctf = coerce
{-# INLINE dcctf #-}

-- | CIE RGB does not utilize a gamm function, therefore it is safe to cast the
-- | CIE RGB does not utilize any gamma function, therefore it is safe to cast the
-- `Linearity` kind.
--
-- @since 0.2.0
Expand Down

0 comments on commit 6a3932d

Please sign in to comment.