{-# LANGUAGE CPP #-}
#if MIN_VERSION_base(4,8,0)
{-# LANGUAGE TemplateHaskell #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
#endif
module TextShow.GHC.RTS.Flags () where
#if MIN_VERSION_base(4,8,0)
import GHC.RTS.Flags
import TextShow.Data.Bool ()
import TextShow.Data.Char ()
import TextShow.Data.Floating ()
import TextShow.Data.Integral ()
import TextShow.Data.List ()
import TextShow.Data.Maybe ()
import TextShow.TH.Internal (deriveTextShow)
import TextShow.TH.Names (giveGCStatsTypeName, doCostCentresTypeName,
doHeapProfileTypeName, doTraceTypeName)
$(deriveTextShow giveGCStatsTypeName)
$(deriveTextShow doCostCentresTypeName)
$(deriveTextShow doHeapProfileTypeName)
$(deriveTextShow doTraceTypeName)
$(deriveTextShow ''GCFlags)
$(deriveTextShow ''ConcFlags)
# if MIN_VERSION_base(4,15,0)
$(deriveTextShow ''IoSubSystem)
# endif
$(deriveTextShow ''MiscFlags)
$(deriveTextShow ''DebugFlags)
$(deriveTextShow ''CCFlags)
$(deriveTextShow ''ProfFlags)
$(deriveTextShow ''TraceFlags)
$(deriveTextShow ''TickyFlags)
# if MIN_VERSION_base(4,10,0)
$(deriveTextShow ''ParFlags)
# endif
# if MIN_VERSION_base(4,20,0)
$(deriveTextShow ''HpcFlags)
# endif
$(deriveTextShow ''RTSFlags)
#endif