{-# LINE 1 "src/NanoVG/Internal/State.chs" #-}
module NanoVG.Internal.State where
import qualified Foreign.Ptr as C2HSImp
import NanoVG.Internal.Context
{-# LINE 7 "src/NanoVG/Internal/State.chs" #-}
save :: (Context) -> IO ()
save a1 =
let {a1' = id a1} in
save'_ a1' >>
return ()
{-# LINE 13 "src/NanoVG/Internal/State.chs" #-}
restore :: (Context) -> IO ()
restore a1 =
let {a1' = id a1} in
restore'_ a1' >>
return ()
{-# LINE 17 "src/NanoVG/Internal/State.chs" #-}
reset :: (Context) -> IO ()
reset a1 =
let {a1' = id a1} in
reset'_ a1' >>
return ()
{-# LINE 21 "src/NanoVG/Internal/State.chs" #-}
foreign import ccall unsafe "NanoVG/Internal/State.chs.h nvgSave"
save'_ :: ((Context) -> (IO ()))
foreign import ccall unsafe "NanoVG/Internal/State.chs.h nvgRestore"
restore'_ :: ((Context) -> (IO ()))
foreign import ccall unsafe "NanoVG/Internal/State.chs.h nvgReset"
reset'_ :: ((Context) -> (IO ()))