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

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

-- |
-- Module      : Amazonka.WorkDocs.GetDocumentPath
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Retrieves the path information (the hierarchy from the root folder) for
-- the requested document.
--
-- By default, Amazon WorkDocs returns a maximum of 100 levels upwards from
-- the requested document and only includes the IDs of the parent folders
-- in the path. You can limit the maximum number of levels. You can also
-- request the names of the parent folders.
module Amazonka.WorkDocs.GetDocumentPath
  ( -- * Creating a Request
    GetDocumentPath (..),
    newGetDocumentPath,

    -- * Request Lenses
    getDocumentPath_authenticationToken,
    getDocumentPath_fields,
    getDocumentPath_limit,
    getDocumentPath_marker,
    getDocumentPath_documentId,

    -- * Destructuring the Response
    GetDocumentPathResponse (..),
    newGetDocumentPathResponse,

    -- * Response Lenses
    getDocumentPathResponse_path,
    getDocumentPathResponse_httpStatus,
  )
where

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
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response
import Amazonka.WorkDocs.Types

-- | /See:/ 'newGetDocumentPath' smart constructor.
data GetDocumentPath = GetDocumentPath'
  { -- | Amazon WorkDocs authentication token. Not required when using AWS
    -- administrator credentials to access the API.
    GetDocumentPath -> Maybe (Sensitive Text)
authenticationToken :: Prelude.Maybe (Data.Sensitive Prelude.Text),
    -- | A comma-separated list of values. Specify @NAME@ to include the names of
    -- the parent folders.
    GetDocumentPath -> Maybe Text
fields :: Prelude.Maybe Prelude.Text,
    -- | The maximum number of levels in the hierarchy to return.
    GetDocumentPath -> Maybe Natural
limit :: Prelude.Maybe Prelude.Natural,
    -- | This value is not supported.
    GetDocumentPath -> Maybe Text
marker :: Prelude.Maybe Prelude.Text,
    -- | The ID of the document.
    GetDocumentPath -> Text
documentId :: Prelude.Text
  }
  deriving (GetDocumentPath -> GetDocumentPath -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetDocumentPath -> GetDocumentPath -> Bool
$c/= :: GetDocumentPath -> GetDocumentPath -> Bool
== :: GetDocumentPath -> GetDocumentPath -> Bool
$c== :: GetDocumentPath -> GetDocumentPath -> Bool
Prelude.Eq, Int -> GetDocumentPath -> ShowS
[GetDocumentPath] -> ShowS
GetDocumentPath -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetDocumentPath] -> ShowS
$cshowList :: [GetDocumentPath] -> ShowS
show :: GetDocumentPath -> String
$cshow :: GetDocumentPath -> String
showsPrec :: Int -> GetDocumentPath -> ShowS
$cshowsPrec :: Int -> GetDocumentPath -> ShowS
Prelude.Show, forall x. Rep GetDocumentPath x -> GetDocumentPath
forall x. GetDocumentPath -> Rep GetDocumentPath x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GetDocumentPath x -> GetDocumentPath
$cfrom :: forall x. GetDocumentPath -> Rep GetDocumentPath x
Prelude.Generic)

-- |
-- Create a value of 'GetDocumentPath' 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:
--
-- 'authenticationToken', 'getDocumentPath_authenticationToken' - Amazon WorkDocs authentication token. Not required when using AWS
-- administrator credentials to access the API.
--
-- 'fields', 'getDocumentPath_fields' - A comma-separated list of values. Specify @NAME@ to include the names of
-- the parent folders.
--
-- 'limit', 'getDocumentPath_limit' - The maximum number of levels in the hierarchy to return.
--
-- 'marker', 'getDocumentPath_marker' - This value is not supported.
--
-- 'documentId', 'getDocumentPath_documentId' - The ID of the document.
newGetDocumentPath ::
  -- | 'documentId'
  Prelude.Text ->
  GetDocumentPath
newGetDocumentPath :: Text -> GetDocumentPath
newGetDocumentPath Text
pDocumentId_ =
  GetDocumentPath'
    { $sel:authenticationToken:GetDocumentPath' :: Maybe (Sensitive Text)
authenticationToken =
        forall a. Maybe a
Prelude.Nothing,
      $sel:fields:GetDocumentPath' :: Maybe Text
fields = forall a. Maybe a
Prelude.Nothing,
      $sel:limit:GetDocumentPath' :: Maybe Natural
limit = forall a. Maybe a
Prelude.Nothing,
      $sel:marker:GetDocumentPath' :: Maybe Text
marker = forall a. Maybe a
Prelude.Nothing,
      $sel:documentId:GetDocumentPath' :: Text
documentId = Text
pDocumentId_
    }

-- | Amazon WorkDocs authentication token. Not required when using AWS
-- administrator credentials to access the API.
getDocumentPath_authenticationToken :: Lens.Lens' GetDocumentPath (Prelude.Maybe Prelude.Text)
getDocumentPath_authenticationToken :: Lens' GetDocumentPath (Maybe Text)
getDocumentPath_authenticationToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDocumentPath' {Maybe (Sensitive Text)
authenticationToken :: Maybe (Sensitive Text)
$sel:authenticationToken:GetDocumentPath' :: GetDocumentPath -> Maybe (Sensitive Text)
authenticationToken} -> Maybe (Sensitive Text)
authenticationToken) (\s :: GetDocumentPath
s@GetDocumentPath' {} Maybe (Sensitive Text)
a -> GetDocumentPath
s {$sel:authenticationToken:GetDocumentPath' :: Maybe (Sensitive Text)
authenticationToken = Maybe (Sensitive Text)
a} :: GetDocumentPath) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall a. Iso' (Sensitive a) a
Data._Sensitive

-- | A comma-separated list of values. Specify @NAME@ to include the names of
-- the parent folders.
getDocumentPath_fields :: Lens.Lens' GetDocumentPath (Prelude.Maybe Prelude.Text)
getDocumentPath_fields :: Lens' GetDocumentPath (Maybe Text)
getDocumentPath_fields = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDocumentPath' {Maybe Text
fields :: Maybe Text
$sel:fields:GetDocumentPath' :: GetDocumentPath -> Maybe Text
fields} -> Maybe Text
fields) (\s :: GetDocumentPath
s@GetDocumentPath' {} Maybe Text
a -> GetDocumentPath
s {$sel:fields:GetDocumentPath' :: Maybe Text
fields = Maybe Text
a} :: GetDocumentPath)

-- | The maximum number of levels in the hierarchy to return.
getDocumentPath_limit :: Lens.Lens' GetDocumentPath (Prelude.Maybe Prelude.Natural)
getDocumentPath_limit :: Lens' GetDocumentPath (Maybe Natural)
getDocumentPath_limit = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDocumentPath' {Maybe Natural
limit :: Maybe Natural
$sel:limit:GetDocumentPath' :: GetDocumentPath -> Maybe Natural
limit} -> Maybe Natural
limit) (\s :: GetDocumentPath
s@GetDocumentPath' {} Maybe Natural
a -> GetDocumentPath
s {$sel:limit:GetDocumentPath' :: Maybe Natural
limit = Maybe Natural
a} :: GetDocumentPath)

-- | This value is not supported.
getDocumentPath_marker :: Lens.Lens' GetDocumentPath (Prelude.Maybe Prelude.Text)
getDocumentPath_marker :: Lens' GetDocumentPath (Maybe Text)
getDocumentPath_marker = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDocumentPath' {Maybe Text
marker :: Maybe Text
$sel:marker:GetDocumentPath' :: GetDocumentPath -> Maybe Text
marker} -> Maybe Text
marker) (\s :: GetDocumentPath
s@GetDocumentPath' {} Maybe Text
a -> GetDocumentPath
s {$sel:marker:GetDocumentPath' :: Maybe Text
marker = Maybe Text
a} :: GetDocumentPath)

-- | The ID of the document.
getDocumentPath_documentId :: Lens.Lens' GetDocumentPath Prelude.Text
getDocumentPath_documentId :: Lens' GetDocumentPath Text
getDocumentPath_documentId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDocumentPath' {Text
documentId :: Text
$sel:documentId:GetDocumentPath' :: GetDocumentPath -> Text
documentId} -> Text
documentId) (\s :: GetDocumentPath
s@GetDocumentPath' {} Text
a -> GetDocumentPath
s {$sel:documentId:GetDocumentPath' :: Text
documentId = Text
a} :: GetDocumentPath)

instance Core.AWSRequest GetDocumentPath where
  type
    AWSResponse GetDocumentPath =
      GetDocumentPathResponse
  request :: (Service -> Service) -> GetDocumentPath -> Request GetDocumentPath
request Service -> Service
overrides =
    forall a. ToRequest a => Service -> a -> Request a
Request.get (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy GetDocumentPath
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse GetDocumentPath)))
response =
    forall (m :: * -> *) a.
MonadResource m =>
(Int -> ResponseHeaders -> Object -> Either String (AWSResponse a))
-> (ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy a
-> ClientResponse ClientBody
-> m (Either Error (ClientResponse (AWSResponse a)))
Response.receiveJSON
      ( \Int
s ResponseHeaders
h Object
x ->
          Maybe ResourcePath -> Int -> GetDocumentPathResponse
GetDocumentPathResponse'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"Path")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (forall (f :: * -> *) a. Applicative f => a -> f a
Prelude.pure (forall a. Enum a => a -> Int
Prelude.fromEnum Int
s))
      )

instance Prelude.Hashable GetDocumentPath where
  hashWithSalt :: Int -> GetDocumentPath -> Int
hashWithSalt Int
_salt GetDocumentPath' {Maybe Natural
Maybe Text
Maybe (Sensitive Text)
Text
documentId :: Text
marker :: Maybe Text
limit :: Maybe Natural
fields :: Maybe Text
authenticationToken :: Maybe (Sensitive Text)
$sel:documentId:GetDocumentPath' :: GetDocumentPath -> Text
$sel:marker:GetDocumentPath' :: GetDocumentPath -> Maybe Text
$sel:limit:GetDocumentPath' :: GetDocumentPath -> Maybe Natural
$sel:fields:GetDocumentPath' :: GetDocumentPath -> Maybe Text
$sel:authenticationToken:GetDocumentPath' :: GetDocumentPath -> Maybe (Sensitive Text)
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe (Sensitive Text)
authenticationToken
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
fields
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
limit
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
marker
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Text
documentId

instance Prelude.NFData GetDocumentPath where
  rnf :: GetDocumentPath -> ()
rnf GetDocumentPath' {Maybe Natural
Maybe Text
Maybe (Sensitive Text)
Text
documentId :: Text
marker :: Maybe Text
limit :: Maybe Natural
fields :: Maybe Text
authenticationToken :: Maybe (Sensitive Text)
$sel:documentId:GetDocumentPath' :: GetDocumentPath -> Text
$sel:marker:GetDocumentPath' :: GetDocumentPath -> Maybe Text
$sel:limit:GetDocumentPath' :: GetDocumentPath -> Maybe Natural
$sel:fields:GetDocumentPath' :: GetDocumentPath -> Maybe Text
$sel:authenticationToken:GetDocumentPath' :: GetDocumentPath -> Maybe (Sensitive Text)
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe (Sensitive Text)
authenticationToken
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
fields
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
limit
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
marker
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Text
documentId

instance Data.ToHeaders GetDocumentPath where
  toHeaders :: GetDocumentPath -> ResponseHeaders
toHeaders GetDocumentPath' {Maybe Natural
Maybe Text
Maybe (Sensitive Text)
Text
documentId :: Text
marker :: Maybe Text
limit :: Maybe Natural
fields :: Maybe Text
authenticationToken :: Maybe (Sensitive Text)
$sel:documentId:GetDocumentPath' :: GetDocumentPath -> Text
$sel:marker:GetDocumentPath' :: GetDocumentPath -> Maybe Text
$sel:limit:GetDocumentPath' :: GetDocumentPath -> Maybe Natural
$sel:fields:GetDocumentPath' :: GetDocumentPath -> Maybe Text
$sel:authenticationToken:GetDocumentPath' :: GetDocumentPath -> Maybe (Sensitive Text)
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ HeaderName
"Authentication" forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# Maybe (Sensitive Text)
authenticationToken,
        HeaderName
"Content-Type"
          forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# (ByteString
"application/x-amz-json-1.1" :: Prelude.ByteString)
      ]

instance Data.ToPath GetDocumentPath where
  toPath :: GetDocumentPath -> ByteString
toPath GetDocumentPath' {Maybe Natural
Maybe Text
Maybe (Sensitive Text)
Text
documentId :: Text
marker :: Maybe Text
limit :: Maybe Natural
fields :: Maybe Text
authenticationToken :: Maybe (Sensitive Text)
$sel:documentId:GetDocumentPath' :: GetDocumentPath -> Text
$sel:marker:GetDocumentPath' :: GetDocumentPath -> Maybe Text
$sel:limit:GetDocumentPath' :: GetDocumentPath -> Maybe Natural
$sel:fields:GetDocumentPath' :: GetDocumentPath -> Maybe Text
$sel:authenticationToken:GetDocumentPath' :: GetDocumentPath -> Maybe (Sensitive Text)
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ByteString
"/api/v1/documents/", forall a. ToByteString a => a -> ByteString
Data.toBS Text
documentId, ByteString
"/path"]

instance Data.ToQuery GetDocumentPath where
  toQuery :: GetDocumentPath -> QueryString
toQuery GetDocumentPath' {Maybe Natural
Maybe Text
Maybe (Sensitive Text)
Text
documentId :: Text
marker :: Maybe Text
limit :: Maybe Natural
fields :: Maybe Text
authenticationToken :: Maybe (Sensitive Text)
$sel:documentId:GetDocumentPath' :: GetDocumentPath -> Text
$sel:marker:GetDocumentPath' :: GetDocumentPath -> Maybe Text
$sel:limit:GetDocumentPath' :: GetDocumentPath -> Maybe Natural
$sel:fields:GetDocumentPath' :: GetDocumentPath -> Maybe Text
$sel:authenticationToken:GetDocumentPath' :: GetDocumentPath -> Maybe (Sensitive Text)
..} =
    forall a. Monoid a => [a] -> a
Prelude.mconcat
      [ ByteString
"fields" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
fields,
        ByteString
"limit" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Natural
limit,
        ByteString
"marker" forall a. ToQuery a => ByteString -> a -> QueryString
Data.=: Maybe Text
marker
      ]

-- | /See:/ 'newGetDocumentPathResponse' smart constructor.
data GetDocumentPathResponse = GetDocumentPathResponse'
  { -- | The path information.
    GetDocumentPathResponse -> Maybe ResourcePath
path :: Prelude.Maybe ResourcePath,
    -- | The response's http status code.
    GetDocumentPathResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (GetDocumentPathResponse -> GetDocumentPathResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GetDocumentPathResponse -> GetDocumentPathResponse -> Bool
$c/= :: GetDocumentPathResponse -> GetDocumentPathResponse -> Bool
== :: GetDocumentPathResponse -> GetDocumentPathResponse -> Bool
$c== :: GetDocumentPathResponse -> GetDocumentPathResponse -> Bool
Prelude.Eq, ReadPrec [GetDocumentPathResponse]
ReadPrec GetDocumentPathResponse
Int -> ReadS GetDocumentPathResponse
ReadS [GetDocumentPathResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GetDocumentPathResponse]
$creadListPrec :: ReadPrec [GetDocumentPathResponse]
readPrec :: ReadPrec GetDocumentPathResponse
$creadPrec :: ReadPrec GetDocumentPathResponse
readList :: ReadS [GetDocumentPathResponse]
$creadList :: ReadS [GetDocumentPathResponse]
readsPrec :: Int -> ReadS GetDocumentPathResponse
$creadsPrec :: Int -> ReadS GetDocumentPathResponse
Prelude.Read, Int -> GetDocumentPathResponse -> ShowS
[GetDocumentPathResponse] -> ShowS
GetDocumentPathResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GetDocumentPathResponse] -> ShowS
$cshowList :: [GetDocumentPathResponse] -> ShowS
show :: GetDocumentPathResponse -> String
$cshow :: GetDocumentPathResponse -> String
showsPrec :: Int -> GetDocumentPathResponse -> ShowS
$cshowsPrec :: Int -> GetDocumentPathResponse -> ShowS
Prelude.Show, forall x. Rep GetDocumentPathResponse x -> GetDocumentPathResponse
forall x. GetDocumentPathResponse -> Rep GetDocumentPathResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GetDocumentPathResponse x -> GetDocumentPathResponse
$cfrom :: forall x. GetDocumentPathResponse -> Rep GetDocumentPathResponse x
Prelude.Generic)

-- |
-- Create a value of 'GetDocumentPathResponse' 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:
--
-- 'path', 'getDocumentPathResponse_path' - The path information.
--
-- 'httpStatus', 'getDocumentPathResponse_httpStatus' - The response's http status code.
newGetDocumentPathResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  GetDocumentPathResponse
newGetDocumentPathResponse :: Int -> GetDocumentPathResponse
newGetDocumentPathResponse Int
pHttpStatus_ =
  GetDocumentPathResponse'
    { $sel:path:GetDocumentPathResponse' :: Maybe ResourcePath
path = forall a. Maybe a
Prelude.Nothing,
      $sel:httpStatus:GetDocumentPathResponse' :: Int
httpStatus = Int
pHttpStatus_
    }

-- | The path information.
getDocumentPathResponse_path :: Lens.Lens' GetDocumentPathResponse (Prelude.Maybe ResourcePath)
getDocumentPathResponse_path :: Lens' GetDocumentPathResponse (Maybe ResourcePath)
getDocumentPathResponse_path = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDocumentPathResponse' {Maybe ResourcePath
path :: Maybe ResourcePath
$sel:path:GetDocumentPathResponse' :: GetDocumentPathResponse -> Maybe ResourcePath
path} -> Maybe ResourcePath
path) (\s :: GetDocumentPathResponse
s@GetDocumentPathResponse' {} Maybe ResourcePath
a -> GetDocumentPathResponse
s {$sel:path:GetDocumentPathResponse' :: Maybe ResourcePath
path = Maybe ResourcePath
a} :: GetDocumentPathResponse)

-- | The response's http status code.
getDocumentPathResponse_httpStatus :: Lens.Lens' GetDocumentPathResponse Prelude.Int
getDocumentPathResponse_httpStatus :: Lens' GetDocumentPathResponse Int
getDocumentPathResponse_httpStatus = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GetDocumentPathResponse' {Int
httpStatus :: Int
$sel:httpStatus:GetDocumentPathResponse' :: GetDocumentPathResponse -> Int
httpStatus} -> Int
httpStatus) (\s :: GetDocumentPathResponse
s@GetDocumentPathResponse' {} Int
a -> GetDocumentPathResponse
s {$sel:httpStatus:GetDocumentPathResponse' :: Int
httpStatus = Int
a} :: GetDocumentPathResponse)

instance Prelude.NFData GetDocumentPathResponse where
  rnf :: GetDocumentPathResponse -> ()
rnf GetDocumentPathResponse' {Int
Maybe ResourcePath
httpStatus :: Int
path :: Maybe ResourcePath
$sel:httpStatus:GetDocumentPathResponse' :: GetDocumentPathResponse -> Int
$sel:path:GetDocumentPathResponse' :: GetDocumentPathResponse -> Maybe ResourcePath
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe ResourcePath
path
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus