{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.CodeCommit.Types.ConflictMetadata
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.CodeCommit.Types.ConflictMetadata where

import Amazonka.CodeCommit.Types.FileModes
import Amazonka.CodeCommit.Types.FileSizes
import Amazonka.CodeCommit.Types.IsBinaryFile
import Amazonka.CodeCommit.Types.MergeOperations
import Amazonka.CodeCommit.Types.ObjectTypes
import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import qualified Amazonka.Prelude as Prelude

-- | Information about the metadata for a conflict in a merge operation.
--
-- /See:/ 'newConflictMetadata' smart constructor.
data ConflictMetadata = ConflictMetadata'
  { -- | A boolean value indicating whether there are conflicts in the content of
    -- a file.
    ConflictMetadata -> Maybe Bool
contentConflict :: Prelude.Maybe Prelude.Bool,
    -- | A boolean value indicating whether there are conflicts in the file mode
    -- of a file.
    ConflictMetadata -> Maybe Bool
fileModeConflict :: Prelude.Maybe Prelude.Bool,
    -- | The file modes of the file in the source, destination, and base of the
    -- merge.
    ConflictMetadata -> Maybe FileModes
fileModes :: Prelude.Maybe FileModes,
    -- | The path of the file that contains conflicts.
    ConflictMetadata -> Maybe Text
filePath :: Prelude.Maybe Prelude.Text,
    -- | The file sizes of the file in the source, destination, and base of the
    -- merge.
    ConflictMetadata -> Maybe FileSizes
fileSizes :: Prelude.Maybe FileSizes,
    -- | A boolean value (true or false) indicating whether the file is binary or
    -- textual in the source, destination, and base of the merge.
    ConflictMetadata -> Maybe IsBinaryFile
isBinaryFile :: Prelude.Maybe IsBinaryFile,
    -- | Whether an add, modify, or delete operation caused the conflict between
    -- the source and destination of the merge.
    ConflictMetadata -> Maybe MergeOperations
mergeOperations :: Prelude.Maybe MergeOperations,
    -- | The number of conflicts, including both hunk conflicts and metadata
    -- conflicts.
    ConflictMetadata -> Maybe Int
numberOfConflicts :: Prelude.Maybe Prelude.Int,
    -- | A boolean value (true or false) indicating whether there are conflicts
    -- between the branches in the object type of a file, folder, or submodule.
    ConflictMetadata -> Maybe Bool
objectTypeConflict :: Prelude.Maybe Prelude.Bool,
    -- | Information about any object type conflicts in a merge operation.
    ConflictMetadata -> Maybe ObjectTypes
objectTypes :: Prelude.Maybe ObjectTypes
  }
  deriving (ConflictMetadata -> ConflictMetadata -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ConflictMetadata -> ConflictMetadata -> Bool
$c/= :: ConflictMetadata -> ConflictMetadata -> Bool
== :: ConflictMetadata -> ConflictMetadata -> Bool
$c== :: ConflictMetadata -> ConflictMetadata -> Bool
Prelude.Eq, ReadPrec [ConflictMetadata]
ReadPrec ConflictMetadata
Int -> ReadS ConflictMetadata
ReadS [ConflictMetadata]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ConflictMetadata]
$creadListPrec :: ReadPrec [ConflictMetadata]
readPrec :: ReadPrec ConflictMetadata
$creadPrec :: ReadPrec ConflictMetadata
readList :: ReadS [ConflictMetadata]
$creadList :: ReadS [ConflictMetadata]
readsPrec :: Int -> ReadS ConflictMetadata
$creadsPrec :: Int -> ReadS ConflictMetadata
Prelude.Read, Int -> ConflictMetadata -> ShowS
[ConflictMetadata] -> ShowS
ConflictMetadata -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ConflictMetadata] -> ShowS
$cshowList :: [ConflictMetadata] -> ShowS
show :: ConflictMetadata -> String
$cshow :: ConflictMetadata -> String
showsPrec :: Int -> ConflictMetadata -> ShowS
$cshowsPrec :: Int -> ConflictMetadata -> ShowS
Prelude.Show, forall x. Rep ConflictMetadata x -> ConflictMetadata
forall x. ConflictMetadata -> Rep ConflictMetadata x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep ConflictMetadata x -> ConflictMetadata
$cfrom :: forall x. ConflictMetadata -> Rep ConflictMetadata x
Prelude.Generic)

-- |
-- Create a value of 'ConflictMetadata' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'contentConflict', 'conflictMetadata_contentConflict' - A boolean value indicating whether there are conflicts in the content of
-- a file.
--
-- 'fileModeConflict', 'conflictMetadata_fileModeConflict' - A boolean value indicating whether there are conflicts in the file mode
-- of a file.
--
-- 'fileModes', 'conflictMetadata_fileModes' - The file modes of the file in the source, destination, and base of the
-- merge.
--
-- 'filePath', 'conflictMetadata_filePath' - The path of the file that contains conflicts.
--
-- 'fileSizes', 'conflictMetadata_fileSizes' - The file sizes of the file in the source, destination, and base of the
-- merge.
--
-- 'isBinaryFile', 'conflictMetadata_isBinaryFile' - A boolean value (true or false) indicating whether the file is binary or
-- textual in the source, destination, and base of the merge.
--
-- 'mergeOperations', 'conflictMetadata_mergeOperations' - Whether an add, modify, or delete operation caused the conflict between
-- the source and destination of the merge.
--
-- 'numberOfConflicts', 'conflictMetadata_numberOfConflicts' - The number of conflicts, including both hunk conflicts and metadata
-- conflicts.
--
-- 'objectTypeConflict', 'conflictMetadata_objectTypeConflict' - A boolean value (true or false) indicating whether there are conflicts
-- between the branches in the object type of a file, folder, or submodule.
--
-- 'objectTypes', 'conflictMetadata_objectTypes' - Information about any object type conflicts in a merge operation.
newConflictMetadata ::
  ConflictMetadata
newConflictMetadata :: ConflictMetadata
newConflictMetadata =
  ConflictMetadata'
    { $sel:contentConflict:ConflictMetadata' :: Maybe Bool
contentConflict =
        forall a. Maybe a
Prelude.Nothing,
      $sel:fileModeConflict:ConflictMetadata' :: Maybe Bool
fileModeConflict = forall a. Maybe a
Prelude.Nothing,
      $sel:fileModes:ConflictMetadata' :: Maybe FileModes
fileModes = forall a. Maybe a
Prelude.Nothing,
      $sel:filePath:ConflictMetadata' :: Maybe Text
filePath = forall a. Maybe a
Prelude.Nothing,
      $sel:fileSizes:ConflictMetadata' :: Maybe FileSizes
fileSizes = forall a. Maybe a
Prelude.Nothing,
      $sel:isBinaryFile:ConflictMetadata' :: Maybe IsBinaryFile
isBinaryFile = forall a. Maybe a
Prelude.Nothing,
      $sel:mergeOperations:ConflictMetadata' :: Maybe MergeOperations
mergeOperations = forall a. Maybe a
Prelude.Nothing,
      $sel:numberOfConflicts:ConflictMetadata' :: Maybe Int
numberOfConflicts = forall a. Maybe a
Prelude.Nothing,
      $sel:objectTypeConflict:ConflictMetadata' :: Maybe Bool
objectTypeConflict = forall a. Maybe a
Prelude.Nothing,
      $sel:objectTypes:ConflictMetadata' :: Maybe ObjectTypes
objectTypes = forall a. Maybe a
Prelude.Nothing
    }

-- | A boolean value indicating whether there are conflicts in the content of
-- a file.
conflictMetadata_contentConflict :: Lens.Lens' ConflictMetadata (Prelude.Maybe Prelude.Bool)
conflictMetadata_contentConflict :: Lens' ConflictMetadata (Maybe Bool)
conflictMetadata_contentConflict = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ConflictMetadata' {Maybe Bool
contentConflict :: Maybe Bool
$sel:contentConflict:ConflictMetadata' :: ConflictMetadata -> Maybe Bool
contentConflict} -> Maybe Bool
contentConflict) (\s :: ConflictMetadata
s@ConflictMetadata' {} Maybe Bool
a -> ConflictMetadata
s {$sel:contentConflict:ConflictMetadata' :: Maybe Bool
contentConflict = Maybe Bool
a} :: ConflictMetadata)

-- | A boolean value indicating whether there are conflicts in the file mode
-- of a file.
conflictMetadata_fileModeConflict :: Lens.Lens' ConflictMetadata (Prelude.Maybe Prelude.Bool)
conflictMetadata_fileModeConflict :: Lens' ConflictMetadata (Maybe Bool)
conflictMetadata_fileModeConflict = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ConflictMetadata' {Maybe Bool
fileModeConflict :: Maybe Bool
$sel:fileModeConflict:ConflictMetadata' :: ConflictMetadata -> Maybe Bool
fileModeConflict} -> Maybe Bool
fileModeConflict) (\s :: ConflictMetadata
s@ConflictMetadata' {} Maybe Bool
a -> ConflictMetadata
s {$sel:fileModeConflict:ConflictMetadata' :: Maybe Bool
fileModeConflict = Maybe Bool
a} :: ConflictMetadata)

-- | The file modes of the file in the source, destination, and base of the
-- merge.
conflictMetadata_fileModes :: Lens.Lens' ConflictMetadata (Prelude.Maybe FileModes)
conflictMetadata_fileModes :: Lens' ConflictMetadata (Maybe FileModes)
conflictMetadata_fileModes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ConflictMetadata' {Maybe FileModes
fileModes :: Maybe FileModes
$sel:fileModes:ConflictMetadata' :: ConflictMetadata -> Maybe FileModes
fileModes} -> Maybe FileModes
fileModes) (\s :: ConflictMetadata
s@ConflictMetadata' {} Maybe FileModes
a -> ConflictMetadata
s {$sel:fileModes:ConflictMetadata' :: Maybe FileModes
fileModes = Maybe FileModes
a} :: ConflictMetadata)

-- | The path of the file that contains conflicts.
conflictMetadata_filePath :: Lens.Lens' ConflictMetadata (Prelude.Maybe Prelude.Text)
conflictMetadata_filePath :: Lens' ConflictMetadata (Maybe Text)
conflictMetadata_filePath = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ConflictMetadata' {Maybe Text
filePath :: Maybe Text
$sel:filePath:ConflictMetadata' :: ConflictMetadata -> Maybe Text
filePath} -> Maybe Text
filePath) (\s :: ConflictMetadata
s@ConflictMetadata' {} Maybe Text
a -> ConflictMetadata
s {$sel:filePath:ConflictMetadata' :: Maybe Text
filePath = Maybe Text
a} :: ConflictMetadata)

-- | The file sizes of the file in the source, destination, and base of the
-- merge.
conflictMetadata_fileSizes :: Lens.Lens' ConflictMetadata (Prelude.Maybe FileSizes)
conflictMetadata_fileSizes :: Lens' ConflictMetadata (Maybe FileSizes)
conflictMetadata_fileSizes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ConflictMetadata' {Maybe FileSizes
fileSizes :: Maybe FileSizes
$sel:fileSizes:ConflictMetadata' :: ConflictMetadata -> Maybe FileSizes
fileSizes} -> Maybe FileSizes
fileSizes) (\s :: ConflictMetadata
s@ConflictMetadata' {} Maybe FileSizes
a -> ConflictMetadata
s {$sel:fileSizes:ConflictMetadata' :: Maybe FileSizes
fileSizes = Maybe FileSizes
a} :: ConflictMetadata)

-- | A boolean value (true or false) indicating whether the file is binary or
-- textual in the source, destination, and base of the merge.
conflictMetadata_isBinaryFile :: Lens.Lens' ConflictMetadata (Prelude.Maybe IsBinaryFile)
conflictMetadata_isBinaryFile :: Lens' ConflictMetadata (Maybe IsBinaryFile)
conflictMetadata_isBinaryFile = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ConflictMetadata' {Maybe IsBinaryFile
isBinaryFile :: Maybe IsBinaryFile
$sel:isBinaryFile:ConflictMetadata' :: ConflictMetadata -> Maybe IsBinaryFile
isBinaryFile} -> Maybe IsBinaryFile
isBinaryFile) (\s :: ConflictMetadata
s@ConflictMetadata' {} Maybe IsBinaryFile
a -> ConflictMetadata
s {$sel:isBinaryFile:ConflictMetadata' :: Maybe IsBinaryFile
isBinaryFile = Maybe IsBinaryFile
a} :: ConflictMetadata)

-- | Whether an add, modify, or delete operation caused the conflict between
-- the source and destination of the merge.
conflictMetadata_mergeOperations :: Lens.Lens' ConflictMetadata (Prelude.Maybe MergeOperations)
conflictMetadata_mergeOperations :: Lens' ConflictMetadata (Maybe MergeOperations)
conflictMetadata_mergeOperations = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ConflictMetadata' {Maybe MergeOperations
mergeOperations :: Maybe MergeOperations
$sel:mergeOperations:ConflictMetadata' :: ConflictMetadata -> Maybe MergeOperations
mergeOperations} -> Maybe MergeOperations
mergeOperations) (\s :: ConflictMetadata
s@ConflictMetadata' {} Maybe MergeOperations
a -> ConflictMetadata
s {$sel:mergeOperations:ConflictMetadata' :: Maybe MergeOperations
mergeOperations = Maybe MergeOperations
a} :: ConflictMetadata)

-- | The number of conflicts, including both hunk conflicts and metadata
-- conflicts.
conflictMetadata_numberOfConflicts :: Lens.Lens' ConflictMetadata (Prelude.Maybe Prelude.Int)
conflictMetadata_numberOfConflicts :: Lens' ConflictMetadata (Maybe Int)
conflictMetadata_numberOfConflicts = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ConflictMetadata' {Maybe Int
numberOfConflicts :: Maybe Int
$sel:numberOfConflicts:ConflictMetadata' :: ConflictMetadata -> Maybe Int
numberOfConflicts} -> Maybe Int
numberOfConflicts) (\s :: ConflictMetadata
s@ConflictMetadata' {} Maybe Int
a -> ConflictMetadata
s {$sel:numberOfConflicts:ConflictMetadata' :: Maybe Int
numberOfConflicts = Maybe Int
a} :: ConflictMetadata)

-- | A boolean value (true or false) indicating whether there are conflicts
-- between the branches in the object type of a file, folder, or submodule.
conflictMetadata_objectTypeConflict :: Lens.Lens' ConflictMetadata (Prelude.Maybe Prelude.Bool)
conflictMetadata_objectTypeConflict :: Lens' ConflictMetadata (Maybe Bool)
conflictMetadata_objectTypeConflict = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ConflictMetadata' {Maybe Bool
objectTypeConflict :: Maybe Bool
$sel:objectTypeConflict:ConflictMetadata' :: ConflictMetadata -> Maybe Bool
objectTypeConflict} -> Maybe Bool
objectTypeConflict) (\s :: ConflictMetadata
s@ConflictMetadata' {} Maybe Bool
a -> ConflictMetadata
s {$sel:objectTypeConflict:ConflictMetadata' :: Maybe Bool
objectTypeConflict = Maybe Bool
a} :: ConflictMetadata)

-- | Information about any object type conflicts in a merge operation.
conflictMetadata_objectTypes :: Lens.Lens' ConflictMetadata (Prelude.Maybe ObjectTypes)
conflictMetadata_objectTypes :: Lens' ConflictMetadata (Maybe ObjectTypes)
conflictMetadata_objectTypes = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ConflictMetadata' {Maybe ObjectTypes
objectTypes :: Maybe ObjectTypes
$sel:objectTypes:ConflictMetadata' :: ConflictMetadata -> Maybe ObjectTypes
objectTypes} -> Maybe ObjectTypes
objectTypes) (\s :: ConflictMetadata
s@ConflictMetadata' {} Maybe ObjectTypes
a -> ConflictMetadata
s {$sel:objectTypes:ConflictMetadata' :: Maybe ObjectTypes
objectTypes = Maybe ObjectTypes
a} :: ConflictMetadata)

instance Data.FromJSON ConflictMetadata where
  parseJSON :: Value -> Parser ConflictMetadata
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"ConflictMetadata"
      ( \Object
x ->
          Maybe Bool
-> Maybe Bool
-> Maybe FileModes
-> Maybe Text
-> Maybe FileSizes
-> Maybe IsBinaryFile
-> Maybe MergeOperations
-> Maybe Int
-> Maybe Bool
-> Maybe ObjectTypes
-> ConflictMetadata
ConflictMetadata'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"contentConflict")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"fileModeConflict")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"fileModes")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"filePath")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"fileSizes")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"isBinaryFile")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"mergeOperations")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"numberOfConflicts")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"objectTypeConflict")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"objectTypes")
      )

instance Prelude.Hashable ConflictMetadata where
  hashWithSalt :: Int -> ConflictMetadata -> Int
hashWithSalt Int
_salt ConflictMetadata' {Maybe Bool
Maybe Int
Maybe Text
Maybe FileModes
Maybe FileSizes
Maybe IsBinaryFile
Maybe MergeOperations
Maybe ObjectTypes
objectTypes :: Maybe ObjectTypes
objectTypeConflict :: Maybe Bool
numberOfConflicts :: Maybe Int
mergeOperations :: Maybe MergeOperations
isBinaryFile :: Maybe IsBinaryFile
fileSizes :: Maybe FileSizes
filePath :: Maybe Text
fileModes :: Maybe FileModes
fileModeConflict :: Maybe Bool
contentConflict :: Maybe Bool
$sel:objectTypes:ConflictMetadata' :: ConflictMetadata -> Maybe ObjectTypes
$sel:objectTypeConflict:ConflictMetadata' :: ConflictMetadata -> Maybe Bool
$sel:numberOfConflicts:ConflictMetadata' :: ConflictMetadata -> Maybe Int
$sel:mergeOperations:ConflictMetadata' :: ConflictMetadata -> Maybe MergeOperations
$sel:isBinaryFile:ConflictMetadata' :: ConflictMetadata -> Maybe IsBinaryFile
$sel:fileSizes:ConflictMetadata' :: ConflictMetadata -> Maybe FileSizes
$sel:filePath:ConflictMetadata' :: ConflictMetadata -> Maybe Text
$sel:fileModes:ConflictMetadata' :: ConflictMetadata -> Maybe FileModes
$sel:fileModeConflict:ConflictMetadata' :: ConflictMetadata -> Maybe Bool
$sel:contentConflict:ConflictMetadata' :: ConflictMetadata -> Maybe Bool
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
contentConflict
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
fileModeConflict
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe FileModes
fileModes
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
filePath
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe FileSizes
fileSizes
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe IsBinaryFile
isBinaryFile
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe MergeOperations
mergeOperations
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
numberOfConflicts
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Bool
objectTypeConflict
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe ObjectTypes
objectTypes

instance Prelude.NFData ConflictMetadata where
  rnf :: ConflictMetadata -> ()
rnf ConflictMetadata' {Maybe Bool
Maybe Int
Maybe Text
Maybe FileModes
Maybe FileSizes
Maybe IsBinaryFile
Maybe MergeOperations
Maybe ObjectTypes
objectTypes :: Maybe ObjectTypes
objectTypeConflict :: Maybe Bool
numberOfConflicts :: Maybe Int
mergeOperations :: Maybe MergeOperations
isBinaryFile :: Maybe IsBinaryFile
fileSizes :: Maybe FileSizes
filePath :: Maybe Text
fileModes :: Maybe FileModes
fileModeConflict :: Maybe Bool
contentConflict :: Maybe Bool
$sel:objectTypes:ConflictMetadata' :: ConflictMetadata -> Maybe ObjectTypes
$sel:objectTypeConflict:ConflictMetadata' :: ConflictMetadata -> Maybe Bool
$sel:numberOfConflicts:ConflictMetadata' :: ConflictMetadata -> Maybe Int
$sel:mergeOperations:ConflictMetadata' :: ConflictMetadata -> Maybe MergeOperations
$sel:isBinaryFile:ConflictMetadata' :: ConflictMetadata -> Maybe IsBinaryFile
$sel:fileSizes:ConflictMetadata' :: ConflictMetadata -> Maybe FileSizes
$sel:filePath:ConflictMetadata' :: ConflictMetadata -> Maybe Text
$sel:fileModes:ConflictMetadata' :: ConflictMetadata -> Maybe FileModes
$sel:fileModeConflict:ConflictMetadata' :: ConflictMetadata -> Maybe Bool
$sel:contentConflict:ConflictMetadata' :: ConflictMetadata -> Maybe Bool
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
contentConflict
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
fileModeConflict
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe FileModes
fileModes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
filePath
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe FileSizes
fileSizes
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe IsBinaryFile
isBinaryFile
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe MergeOperations
mergeOperations
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
numberOfConflicts
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Bool
objectTypeConflict
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe ObjectTypes
objectTypes