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

{-# LANGUAGE NoMonomorphismRestriction #-}

module Graphics.UI.Qtah.Widgets.QAbstractGraphicsShapeItem (
  QAbstractGraphicsShapeItemValue (..),
  QAbstractGraphicsShapeItemConstPtr (..),
  QAbstractGraphicsShapeItemPtr (..),
  QAbstractGraphicsShapeItemConst,
  QAbstractGraphicsShapeItem,
  castConst,
  cast,
  downCastConst,
  downCast,
  brush,
  pen,
  setBrush,
  setPen,
  ) where

import Graphics.UI.Qtah.Generated.Widgets.QAbstractGraphicsShapeItem
import Prelude ()


castConst = toQAbstractGraphicsShapeItemConst
cast = toQAbstractGraphicsShapeItem
downCastConst = downToQAbstractGraphicsShapeItemConst
downCast = downToQAbstractGraphicsShapeItem