{-# LANGUAGE NoImplicitPrelude #-}

-- | Functions related to Stack's @update@ command.

module Stack.Update
  ( updateCmd
  ) where

import          Stack.Prelude
import          Stack.Runners ( ShouldReexec (..), withConfig )
import          Stack.Types.Runner ( Runner )

-- | Function underlying the @stack update@ command. Update the package index.

updateCmd :: () -> RIO Runner ()
updateCmd :: () -> RIO Runner ()
updateCmd () = ShouldReexec -> RIO Config () -> RIO Runner ()
forall a. ShouldReexec -> RIO Config a -> RIO Runner a
withConfig ShouldReexec
NoReexec (RIO Config DidUpdateOccur -> RIO Config ()
forall (f :: * -> *) a. Functor f => f a -> f ()
void (Maybe Utf8Builder -> RIO Config DidUpdateOccur
forall env.
(HasPantryConfig env, HasLogFunc env) =>
Maybe Utf8Builder -> RIO env DidUpdateOccur
updateHackageIndex Maybe Utf8Builder
forall a. Maybe a
Nothing))