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

{-# LANGUAGE NoMonomorphismRestriction #-}

module Graphics.UI.Qtah.Widgets.QDateEdit (
  QDateEditValue (..),
  QDateEditConstPtr (..),
  QDateEditPtr (..),
  QDateEditConst,
  QDateEdit,
  castConst,
  cast,
  downCastConst,
  downCast,
  new,
  newWithDate,
  newWithDateAndParent,
  newWithParent,
  ) where

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


castConst = toQDateEditConst
cast = toQDateEdit
downCastConst = downToQDateEditConst
downCast = downToQDateEdit