{-# LANGUAGE CPP #-}
#if __GLASGOW_HASKELL__ >=704
{-# LANGUAGE Safe #-}
#elif __GLASGOW_HASKELL__ >=702
{-# LANGUAGE Trustworthy #-}
#endif
module RERE (
RE (..),
ch_, (\/), star_, let_, fix_, (>>>=),
#ifdef RERE_INTERSECTION
(/\),
#endif
string_,
nullable, derivative, compact, size,
match,
generate,
Var (..), unvar,
Name,
#ifndef RERE_NO_CFG
CFG, CFGBase,
cfgToRE,
#endif
RR, matchR, matchDebugR,
RST, matchST, matchDebugST,
CharClasses,
charClasses,
classOfChar,
putLatex,
putLatexTrace,
#ifndef RERE_NO_CFG
putLatexCFG,
#endif
) where
import RERE.CharClasses
import RERE.Gen
import RERE.LaTeX
import RERE.Ref
import RERE.ST
import RERE.Type
import RERE.Var
#ifndef RERE_NO_CFG
import RERE.CFG
#endif