{-# LANGUAGE Safe #-}

-- |
-- Copyright: (c) 2011 National Institute of Aerospace / Galois, Inc.
--
-- 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 =
  String -> a
forall a. HasCallStack => String -> a
error (String -> a) -> String -> a
forall a b. (a -> b) -> a -> b
$ String
"Impossible error in function "
    String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
function String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
", in package " String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
package
    String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
". Please file an issue at "
    String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
"https://github.com/Copilot-Language/copilot/issues"
    String -> String -> String
forall a. [a] -> [a] -> [a]
++ String
" or email the maintainers at <ivan.perezdominguez@nasa.gov>"