{-# LANGUAGE FlexibleContexts, FlexibleInstances, ForeignFunctionInterface, GeneralizedNewtypeDeriving, MonoLocalBinds, MultiParamTypeClasses, ScopedTypeVariables, TypeSynonymInstances, UndecidableInstances #-}
---------- GENERATED FILE, EDITS WILL BE LOST ----------

{-# LANGUAGE NoMonomorphismRestriction #-}

module Graphics.UI.Qtah.Gui.QPainterPath (
  QPainterPathValue (..),
  QPainterPathConstPtr (..),
  QPainterPathPtr (..),
  QPainterPathConst,
  QPainterPath,
  castConst,
  cast,
  downCastConst,
  downCast,
  decode,
  new,
  newCopy,
  aSSIGN,
  addRectRaw,
  eQ,
  nE,
  ) where

import qualified Foreign.Hoppy.Runtime as QtahFHR
import Graphics.UI.Qtah.Generated.Gui.QPainterPath
import qualified Graphics.UI.Qtah.Generated.Gui.QPainterPath as M146
import Prelude ()
import qualified Prelude as QtahP


castConst = toQPainterPathConst
cast = toQPainterPath
downCastConst = downToQPainterPathConst
downCast = downToQPainterPath

decode :: (QPainterPathConstPtr this) => this -> QtahP.IO M146.QPainterPath
decode = QtahFHR.decode QtahP.. toQPainterPathConst