{-# LINE 1 "FreeType/Exception/Types.hsc" #-}
module FreeType.Exception.Types where

import           Control.Exception
import           Data.Data (Typeable)

{-# LINE 8 "FreeType/Exception/Types.hsc" #-}

import           Data.Int




type FT_Error = Int32
{-# LINE 15 "FreeType/Exception/Types.hsc" #-}

-- | This is thrown whenever a function returns 'FT_Error'.
data FtError = FtError
                 { feFunction :: [Char]
                 , feCode     :: FT_Error
                 }
               deriving Typeable

instance Show FtError where
  show (FtError name code) =
    "FreeType function " <> show name <> " returned error code " <> show code

instance Exception FtError