{-# LANGUAGE RecordWildCards #-}
module Terraform.HttpBackend.Pass.Env where

import Terraform.HttpBackend.Pass.Options (Options(..))
newtype Env = Env { Env -> FilePath
directory :: FilePath}

mkEnv :: Options -> Env
mkEnv :: Options -> Env
mkEnv Options {Int
FilePath
port :: Options -> Int
repositoryPath :: Options -> FilePath
port :: Int
repositoryPath :: FilePath
..}=  Env { directory :: FilePath
directory = FilePath
repositoryPath }