{-# LANGUAGE FlexibleContexts   #-}
{-# LANGUAGE StandaloneDeriving #-}
{-# LANGUAGE TypeFamilies       #-}

-----------------------------------------------------------------------------
-- |
-- Module      :  Generics.Regular.Rewriting.Representations
-- Copyright   :  (c) 2008 Universiteit Utrecht
-- License     :  BSD3
--
-- Maintainer  :  generics@haskell.org
-- Stability   :  experimental
-- Portability :  non-portable
--
-- Summary: Types for structural representation. This module simply reexports
-- "Generics.Regular.Base", and is provided for backwards-compatibility only.
-----------------------------------------------------------------------------

module Generics.Regular.Rewriting.Representations (
    module Generics.Regular.Base
  ) where

import Generics.Regular.Base