{-# LANGUAGE CPP #-}
{-# LANGUAGE TemplateHaskell #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
module TextShow.Text.Read () where
import Text.Read.Lex (Lexeme)
import TextShow.Data.Char ()
import TextShow.Data.Integral ()
import TextShow.Data.List ()
import TextShow.Data.Maybe ()
import TextShow.Data.Ratio ()
import TextShow.TH.Internal (deriveTextShow)
#if MIN_VERSION_base(4,6,0)
import TextShow.TH.Names (numberTypeName)
#endif
#if MIN_VERSION_base(4,6,0)
$(deriveTextShow numberTypeName)
#endif
$(deriveTextShow ''Lexeme)