Skip to content
Snippets Groups Projects
Commit 2591815c authored by Robert's avatar Robert Committed by mergify-bot
Browse files

Simplify RepoName

parent 8900cd09
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE DeriveGeneric #-}
module Distribution.Client.Types.RepoName (
RepoName (..),
unRepoName,
) where
import Distribution.Client.Compat.Prelude
......@@ -17,12 +16,9 @@ import qualified Text.PrettyPrint as Disp
--
-- May be used as path segment.
--
newtype RepoName = RepoName String
newtype RepoName = RepoName { unRepoName :: String }
deriving (Show, Eq, Ord, Generic)
unRepoName :: RepoName -> String
unRepoName (RepoName n) = n
instance Binary RepoName
instance Structured RepoName
instance NFData RepoName
......
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment