{-# LANGUAGE ApplicativeDo #-}
{-# LANGUAGE GADTs #-}
{-# OPTIONS_GHC -Wno-duplicate-exports #-}
module OptEnvConf
(
runSettingsParser,
HasParser (..),
Parser,
runParser,
setting,
filePathSetting,
directoryPathSetting,
help,
reader,
argument,
option,
switch,
long,
short,
env,
conf,
confWith,
confWith',
name,
value,
hidden,
metavar,
commands,
command,
defaultCommand,
optional,
(<$>),
(<*>),
(<|>),
many,
some,
select,
subArgs,
subArgs_,
subEnv,
subEnv_,
subConfig,
subConfig_,
subAll,
subSettings,
allOrNothing,
toArgCase,
toEnvCase,
toConfigCase,
someNonEmpty,
checkEither,
checkMaybe,
checkMapEither,
checkMapIO,
checkMapMaybe,
checkMapEitherForgivable,
checkMapIOForgivable,
checkMapMaybeForgivable,
checkMapMaybe,
mapIO,
choice,
withDefault,
withShownDefault,
withConfig,
withYamlConfig,
withFirstYamlConfig,
withCombinedYamlConfigs,
withCombinedYamlConfigs',
xdgYamlConfigFile,
withLocalYamlConfig,
withConfigurableYamlConfig,
withoutConfig,
enableDisableSwitch,
yesNoSwitch,
makeDoubleSwitch,
readSecretTextFile,
secretTextFileSetting,
secretTextFileOrBareSetting,
strOption,
strArgument,
str,
auto,
exists,
maybeReader,
eitherReader,
commaSeparatedList,
commaSeparated,
commaSeparatedSet,
module OptEnvConf.Casing,
module OptEnvConf.Doc,
module OptEnvConf.Nix,
module OptEnvConf.Parser,
module OptEnvConf.Reader,
module OptEnvConf.Run,
module OptEnvConf.Setting,
module Control.Applicative,
)
where
import Control.Applicative
import OptEnvConf.Casing
import OptEnvConf.Doc
import OptEnvConf.Nix
import OptEnvConf.Parser
import OptEnvConf.Reader
import OptEnvConf.Run
import OptEnvConf.Setting