{-# LANGUAGE Arrows, NoMonomorphismRestriction, RebindableSyntax #-}
module System.ArrowVHDL.Circuit.IEEE_STD_LOGIC_1164  
       ( aAnd
       , aOr
       , aXor
       , aNot
       ) where

import System.ArrowVHDL.Circuit.Defaults (aAnd, aOr, aXor, aNot)