{-# LANGUAGE DeriveGeneric #-}

module Terraform.HttpBackend.Pass.Options where

import GHC.Generics (Generic)
import Options.Applicative
import Options.Generic (ParseRecord)

data Options = Options {Options -> FilePath
repositoryPath :: FilePath, Options -> Int
port :: Int}
  deriving (forall x. Rep Options x -> Options
forall x. Options -> Rep Options x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep Options x -> Options
$cfrom :: forall x. Options -> Rep Options x
Generic)

instance ParseRecord Options