{-# OPTIONS_GHC -fno-warn-orphans #-}
module GHCJS.Marshal.Pure ( PFromJSVal(..)
                          , PToJSVal(..)
                          ) where

import           GHCJS.Types
import           GHCJS.Foreign.Internal (jsFalse, jsTrue)
import           GHCJS.Marshal.Internal

instance PFromJSVal JSVal where pFromJSVal :: JSVal -> JSVal
pFromJSVal = JSVal -> JSVal
forall a. a -> a
id
                                {-# INLINE pFromJSVal #-}
instance PFromJSVal ()    where pFromJSVal :: JSVal -> ()
pFromJSVal JSVal
_ = ()
                                {-# INLINE pFromJSVal #-}

instance PToJSVal JSVal     where pToJSVal :: JSVal -> JSVal
pToJSVal = JSVal -> JSVal
forall a. a -> a
id
                                  {-# INLINE pToJSVal #-}
instance PToJSVal Bool      where pToJSVal :: Bool -> JSVal
pToJSVal Bool
True     = JSVal
jsTrue
                                  pToJSVal Bool
False    = JSVal
jsFalse
                                  {-# INLINE pToJSVal #-}