{-# LINE 1 "FreeType/Error/Enumerations/Internal.hsc" #-}
{-# LANGUAGE ForeignFunctionInterface #-}

module FreeType.Error.Enumerations.Internal
  ( -- ** FT_Error_String
    ft_Error_String'
  ) where

import           FreeType.Core.Types.Types

import           Data.Int
import           Foreign.Ptr




foreign import ccall "FT_Error_String"
  ft_Error_String'
    :: FT_Error              -- ^ error_code
    -> IO (Ptr Int8)
{-# LINE 20 "FreeType/Error/Enumerations/Internal.hsc" #-}