--------------------------------------------------------------------------------
-- Copyright © 2011 National Institute of Aerospace / Galois, Inc.
--------------------------------------------------------------------------------
{-# LANGUAGE Safe #-}

-- | Custom functions to report error messages to users.
module Copilot.Compile.C99.Error
    ( impossible )
  where

-- | Report an error due to a bug in Copilot.
impossible :: String -- ^ Name of the function in which the error was detected.
           -> String -- ^ Name of the package in which the function is located.
           -> a
impossible :: forall a. String -> String -> a
impossible String
function String
package =
  forall a. HasCallStack => String -> a
error forall a b. (a -> b) -> a -> b
$ String
"Impossible error in function "
    forall a. [a] -> [a] -> [a]
++ String
function forall a. [a] -> [a] -> [a]
++ String
", in package " forall a. [a] -> [a] -> [a]
++ String
package
    forall a. [a] -> [a] -> [a]
++ String
". Please file an issue at "
    forall a. [a] -> [a] -> [a]
++ String
"https://github.com/Copilot-Language/copilot/issues"
    forall a. [a] -> [a] -> [a]
++ String
" or email the maintainers at <ivan.perezdominguez@nasa.gov>"