ghup/app/Main.hs

185 lines
5.5 KiB
Haskell
Raw Normal View History

2020-01-30 18:40:08 +00:00
module Main where
2020-01-31 16:38:29 +00:00
import Control.Error.Util
2020-01-31 14:54:41 +00:00
import Control.Monad.Except
2020-01-31 16:38:29 +00:00
import Control.Monad.Reader
2020-01-30 18:40:08 +00:00
import Data.ByteString ( ByteString )
2020-01-31 14:54:41 +00:00
import qualified Data.ByteString.UTF8 as UTF8
import Data.Dates ( getCurrentDateTime
, parseDate
, DateTime(..)
)
2020-01-30 18:40:08 +00:00
import Data.Functor ( (<&>) )
2020-01-31 18:34:05 +00:00
import Data.Maybe
2020-01-30 18:40:08 +00:00
import Data.Semigroup ( (<>) )
2020-01-31 14:54:41 +00:00
import qualified Data.Text as T
2020-01-31 18:34:05 +00:00
import Data.Time.Calendar
2020-01-31 14:54:41 +00:00
import Data.Time.Clock
import Data.Time.Format
2020-01-31 18:34:05 +00:00
import Data.Time.Format.ISO8601
2020-01-30 18:40:08 +00:00
import GHup
import GitHub.Auth
2020-01-31 14:54:41 +00:00
import GitHub.Data.Repos
2020-01-31 16:38:29 +00:00
import GitHub.Data.URL
2020-01-30 18:40:08 +00:00
import HPath
import Options.Applicative
2020-01-30 22:12:46 +00:00
import System.Console.Pretty
2020-01-30 18:40:08 +00:00
import System.Exit
2020-01-31 22:18:45 +00:00
import Text.Layout.Table
2020-01-30 18:40:08 +00:00
data Options = Options
{ optCommand :: Command
}
data Command
= Fork ForkOptions
| Config ConfigOptions
| Del DelOptions
2020-01-31 14:54:41 +00:00
| ListForks ListForkOptions
2020-01-30 18:40:08 +00:00
data ForkOptions = ForkOptions
{
repo :: ByteString
, newBranch :: Maybe ByteString
, repoBasePath :: Maybe ByteString
}
2020-01-31 14:54:41 +00:00
data ListForkOptions = ListForkOptions
{
lSince :: Maybe ByteString
}
2020-01-30 18:40:08 +00:00
data ConfigOptions = ConfigOptions {
2020-01-30 22:12:46 +00:00
oAuth :: ByteString
, bPath :: Maybe ByteString
2020-01-30 18:40:08 +00:00
}
data DelOptions = DelOptions {
del :: ByteString
}
opts :: Parser Command
opts = subparser
2020-01-31 23:38:33 +00:00
( command "fork" (Fork <$> (info (forkOpts <**> helper) (progDesc "Fork a repository")))
<> command "config" (Config <$> (info (configOpts <**> helper) (progDesc "Set ghup config (such as OAuth)")))
<> command "delete" (Del <$> (info (delOpts <**> helper) (progDesc "Delete a forked repository")))
<> command "list-forks" (ListForks <$> (info (lForkOpts <**> helper) (progDesc "List my forks")))
2020-01-30 18:40:08 +00:00
)
configOpts :: Parser ConfigOptions
2020-01-30 22:12:46 +00:00
configOpts =
ConfigOptions
<$> strOption
(short 'o' <> long "oauth" <> metavar "OAUTH" <> help
"The OAUTH token"
)
<*> optional
(strOption
((short 'p') <> long "base-path" <> metavar "BASE_PATH" <> help
"The base path to clone into"
)
)
2020-01-30 18:40:08 +00:00
forkOpts :: Parser ForkOptions
forkOpts =
ForkOptions
<$> strOption
(short 'r' <> long "repo" <> metavar "REPO" <> help
"The repository to fork"
)
<*> optional
(strOption
(short 'b' <> long "branch" <> metavar "BRANCH" <> help
"The branch to create after cloning the fork"
)
)
<*> optional
(strOption
(short 'p' <> long "repo-path" <> metavar "REPO_PATH" <> help
"The base path where to clone the repository to"
)
)
delOpts :: Parser DelOptions
delOpts = DelOptions <$> strOption
(short 'r' <> long "repo" <> metavar "REPO" <> help "The REPO fork to delete")
2020-01-31 14:54:41 +00:00
lForkOpts :: Parser ListForkOptions
lForkOpts = ListForkOptions <$> optional
(strOption
(short 's' <> long "since" <> metavar "SINCE" <> help
"The repository to fork"
)
)
2020-01-30 18:40:08 +00:00
main :: IO ()
main = do
2020-01-31 22:22:37 +00:00
-- wrapper to run effects with settings
2020-01-31 22:18:45 +00:00
let run e = do
2020-01-31 22:25:14 +00:00
settings <- exceptT
(\_ -> die
. color Red
$ "Could not get settings, make sure to run 'ghup config' first"
)
pure
$ getSettings
(flip runReaderT) settings . runExceptT . withExceptT show $ e
2020-02-01 13:58:54 +00:00
e <- customExecParser (prefs showHelpOnError) (info (opts <**> helper) idm) >>= \case
2020-01-31 22:22:37 +00:00
-- fork
2020-01-31 16:38:29 +00:00
Fork (ForkOptions {..}) -> run $ do
2020-01-30 18:40:08 +00:00
case repoBasePath of
Just rbp -> case parseAbs rbp of
Just p -> prepareRepoForPR' repo (Just p) newBranch
2020-01-31 16:38:29 +00:00
Nothing -> liftIO $ die (color Red $ "Repo path must be absolute")
2020-01-30 18:40:08 +00:00
Nothing -> prepareRepoForPR' repo Nothing newBranch
2020-01-31 22:22:37 +00:00
-- config
2020-01-30 22:12:46 +00:00
Config (ConfigOptions {..}) -> do
p <- maybe (pure Nothing) (fmap Just . parseAbs) bPath
writeSettings (Settings (OAuth oAuth) p) <&> Right
2020-01-31 22:22:37 +00:00
-- delete
2020-01-31 16:38:29 +00:00
Del (DelOptions {..} ) -> run $ deleteFork' del
2020-01-31 22:22:37 +00:00
-- list-forks
2020-01-31 16:38:29 +00:00
ListForks (ListForkOptions {..}) -> run $ do
mtime <- liftIO $ case lSince of
2020-01-31 22:25:14 +00:00
Just t' -> do
2020-01-31 14:54:41 +00:00
dt <- getCurrentDateTime
let mt =
2020-01-31 22:25:14 +00:00
either (const Nothing) Just . parseDate dt . UTF8.toString $ t'
2020-01-31 14:54:41 +00:00
pure $ mt >>= \t ->
(parseTimeM
True
defaultTimeLocale
"%Y-%-m-%-d"
(show (year t) <> "-" <> show (month t) <> "-" <> show (day t)) :: Maybe
UTCTime
)
Nothing -> pure Nothing
2020-01-31 16:38:29 +00:00
forks <- withExceptT show $ getForks mtime
2020-01-31 22:18:45 +00:00
let formatted =
gridString [column expand left def def
,column expand left def def]
$ fmap
(\Repo {..} ->
[ (T.unpack . getUrl $ repoHtmlUrl)
, formatShow (iso8601Format :: Format Day)
(utctDay $ fromJust repoUpdatedAt)
]
)
forks
2020-01-31 16:38:29 +00:00
liftIO $ putStrLn $ formatted
2020-01-31 14:54:41 +00:00
pure ()
2020-01-31 22:22:37 +00:00
-- print error, if any
2020-01-30 18:40:08 +00:00
case e of
2020-01-31 16:38:29 +00:00
Right () -> pure ()
2020-01-30 22:12:46 +00:00
Left t -> die (color Red $ t)