-- GENERATED by C->Haskell Compiler, version 0.28.6 Switcheroo, 25 November 2017 (Haskell)
-- Edit the ORIGNAL .chs file instead!


{-# LINE 1 "./GI/Cairo/Render/Internal/Surfaces/SVG.chs" #-}
{-# LANGUAGE CPP #-}
-----------------------------------------------------------------------------
-- |
-- Module      :  GI.Cairo.Render.Internal.Surfaces.SVG
-- Copyright   :  (c) Duncan Coutts 2007
-- License     :  BSD-style (see doc/COPYRIGHT)
--
-- Maintainer  :  p.martini@neuralnoise.com
-- Stability   :  experimental
-- Portability :  portable
--
-- Rendering SVG images.
-----------------------------------------------------------------------------



module GI.Cairo.Render.Internal.Surfaces.SVG where
import qualified Foreign.C.Types as C2HSImp
import qualified Foreign.Ptr as C2HSImp



import GI.Cairo.Render.Types
{-# LINE 19 "./GI/Cairo/Render/Internal/Surfaces/SVG.chs" #-}


import Foreign
import Foreign.C


{-# LINE 24 "./GI/Cairo/Render/Internal/Surfaces/SVG.chs" #-}



svgSurfaceCreate :: (FilePath) -> (Double) -> (Double) -> IO ((Surface))
svgSurfaceCreate a1 a2 a3 =
  withCAString a1 $ \a1' ->
  let {a2' = realToFrac a2} in
  let {a3' = realToFrac a3} in
  svgSurfaceCreate'_ a1' a2' a3' >>= \res ->
  mkSurface res >>= \res' ->
  return (res')

{-# LINE 28 "./GI/Cairo/Render/Internal/Surfaces/SVG.chs" #-}



foreign import ccall safe "GI/Cairo/Render/Internal/Surfaces/SVG.chs.h cairo_svg_surface_create"
  svgSurfaceCreate'_ :: ((C2HSImp.Ptr C2HSImp.CChar) -> (C2HSImp.CDouble -> (C2HSImp.CDouble -> (IO (SurfacePtr)))))