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

{-# LANGUAGE NoMonomorphismRestriction #-}

module Graphics.UI.Qtah.Gui.QPolygonF (
  QPolygonFValue (..),
  QPolygonFConstPtr (..),
  QPolygonFPtr (..),
  QPolygonFConst,
  QPolygonF,
  castConst,
  cast,
  downCastConst,
  downCast,
  decode,
  new,
  newCopy,
  newWithPoints,
  newWithPolygon,
  newWithRectangle,
  newWithSize,
  aSSIGN,
  boundingRect,
  containsPoint,
  eQ,
  intersected,
  isClosed,
  nE,
  subtracted,
  swap,
  toPolygon,
  translateByPoint,
  translateByRaw,
  translatedByPoint,
  translatedByRaw,
  united,
  ) where

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


castConst = toQPolygonFConst
cast = toQPolygonF
downCastConst = downToQPolygonFConst
downCast = downToQPolygonF

decode :: (QPolygonFConstPtr this) => this -> QtahP.IO M154.QPolygonF
decode = QtahFHR.decode QtahP.. toQPolygonFConst