{-# LANGUAGE CPP #-}
{-# LANGUAGE DeriveDataTypeable #-}
module Language.Javascript.JSaddle.Exception (
JSException(..)
) where
import qualified Control.Exception as E (Exception)
#ifdef ghcjs_HOST_OS
#if __GLASGOW_HASKELL__ >= 900
import GHC.JS.Prim (JSVal)
#else
import GHCJS.Prim (JSVal)
#endif
#else
import GHCJS.Prim.Internal (JSVal)
#endif
import Data.Typeable (Typeable)
newtype JSException = JSException JSVal deriving (Typeable)
instance Show JSException where show :: JSException -> String
show JSException
_ = String
"JSException"
instance E.Exception JSException