-- |
-- Module      :  Phladiprelio.AuxiliaryG
-- License     :  MIT
-- Stability   :  Experimental
-- Maintainer  :  oleksandr.zhabenko@yahoo.com
--
-- Is from the @dobutokO-poetry-general@ package. Is included here 
-- to minimize dependencies of the package. 
-- Similar functionality is provided by the packages MissingH, extra, ghc 
-- and other packages, but they have a lot of dependencies, so here there are 
-- less dependencies module and package.

{-# LANGUAGE NoImplicitPrelude #-}

module Phladiprelio.AuxiliaryG (
  -- * Help functions
  lastFrom3
  , firstFrom3
  , secondFrom3
) where

import GHC.Base

lastFrom3 :: (a,b,c) -> c
lastFrom3 :: forall a b c. (a, b, c) -> c
lastFrom3 (a
_,b
_,c
z) = c
z
{-# INLINE lastFrom3 #-}

firstFrom3 :: (a, b, c) -> a
firstFrom3 :: forall a b c. (a, b, c) -> a
firstFrom3 (a
x, b
_, c
_) = a
x
{-# INLINE firstFrom3 #-}

secondFrom3 :: (a, b, c) -> b
secondFrom3 :: forall a b c. (a, b, c) -> b
secondFrom3 (a
_, b
y, c
_) = b
y
{-# INLINE secondFrom3 #-}