{-# 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.LicenseManagerLinuxSubscriptions.ListLinuxSubscriptionInstances
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
--
-- Lists the running Amazon EC2 instances that were discovered with
-- commercial Linux subscriptions.
--
-- This operation returns paginated results.
module Amazonka.LicenseManagerLinuxSubscriptions.ListLinuxSubscriptionInstances
  ( -- * Creating a Request
    ListLinuxSubscriptionInstances (..),
    newListLinuxSubscriptionInstances,

    -- * Request Lenses
    listLinuxSubscriptionInstances_filters,
    listLinuxSubscriptionInstances_maxResults,
    listLinuxSubscriptionInstances_nextToken,

    -- * Destructuring the Response
    ListLinuxSubscriptionInstancesResponse (..),
    newListLinuxSubscriptionInstancesResponse,

    -- * Response Lenses
    listLinuxSubscriptionInstancesResponse_instances,
    listLinuxSubscriptionInstancesResponse_nextToken,
    listLinuxSubscriptionInstancesResponse_httpStatus,
  )
where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.LicenseManagerLinuxSubscriptions.Types
import qualified Amazonka.Prelude as Prelude
import qualified Amazonka.Request as Request
import qualified Amazonka.Response as Response

-- | NextToken length limit is half of ddb accepted limit. Increase this
-- limit if parameters in request increases.
--
-- /See:/ 'newListLinuxSubscriptionInstances' smart constructor.
data ListLinuxSubscriptionInstances = ListLinuxSubscriptionInstances'
  { -- | An array of structures that you can use to filter the results to those
    -- that match one or more sets of key-value pairs that you specify. For
    -- example, you can filter by the name of @AmiID@ with an optional operator
    -- to see subscriptions that match, partially match, or don\'t match a
    -- certain Amazon Machine Image (AMI) ID.
    --
    -- The valid names for this filter are:
    --
    -- -   @AmiID@
    --
    -- -   @InstanceID@
    --
    -- -   @AccountID@
    --
    -- -   @Status@
    --
    -- -   @Region@
    --
    -- -   @UsageOperation@
    --
    -- -   @ProductCode@
    --
    -- -   @InstanceType@
    --
    -- The valid Operators for this filter are:
    --
    -- -   @contains@
    --
    -- -   @equals@
    --
    -- -   @Notequal@
    ListLinuxSubscriptionInstances -> Maybe [Filter]
filters :: Prelude.Maybe [Filter],
    -- | Maximum number of results to return in a single call.
    ListLinuxSubscriptionInstances -> Maybe Int
maxResults :: Prelude.Maybe Prelude.Int,
    -- | Token for the next set of results.
    ListLinuxSubscriptionInstances -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text
  }
  deriving (ListLinuxSubscriptionInstances
-> ListLinuxSubscriptionInstances -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListLinuxSubscriptionInstances
-> ListLinuxSubscriptionInstances -> Bool
$c/= :: ListLinuxSubscriptionInstances
-> ListLinuxSubscriptionInstances -> Bool
== :: ListLinuxSubscriptionInstances
-> ListLinuxSubscriptionInstances -> Bool
$c== :: ListLinuxSubscriptionInstances
-> ListLinuxSubscriptionInstances -> Bool
Prelude.Eq, ReadPrec [ListLinuxSubscriptionInstances]
ReadPrec ListLinuxSubscriptionInstances
Int -> ReadS ListLinuxSubscriptionInstances
ReadS [ListLinuxSubscriptionInstances]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListLinuxSubscriptionInstances]
$creadListPrec :: ReadPrec [ListLinuxSubscriptionInstances]
readPrec :: ReadPrec ListLinuxSubscriptionInstances
$creadPrec :: ReadPrec ListLinuxSubscriptionInstances
readList :: ReadS [ListLinuxSubscriptionInstances]
$creadList :: ReadS [ListLinuxSubscriptionInstances]
readsPrec :: Int -> ReadS ListLinuxSubscriptionInstances
$creadsPrec :: Int -> ReadS ListLinuxSubscriptionInstances
Prelude.Read, Int -> ListLinuxSubscriptionInstances -> ShowS
[ListLinuxSubscriptionInstances] -> ShowS
ListLinuxSubscriptionInstances -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListLinuxSubscriptionInstances] -> ShowS
$cshowList :: [ListLinuxSubscriptionInstances] -> ShowS
show :: ListLinuxSubscriptionInstances -> String
$cshow :: ListLinuxSubscriptionInstances -> String
showsPrec :: Int -> ListLinuxSubscriptionInstances -> ShowS
$cshowsPrec :: Int -> ListLinuxSubscriptionInstances -> ShowS
Prelude.Show, forall x.
Rep ListLinuxSubscriptionInstances x
-> ListLinuxSubscriptionInstances
forall x.
ListLinuxSubscriptionInstances
-> Rep ListLinuxSubscriptionInstances x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListLinuxSubscriptionInstances x
-> ListLinuxSubscriptionInstances
$cfrom :: forall x.
ListLinuxSubscriptionInstances
-> Rep ListLinuxSubscriptionInstances x
Prelude.Generic)

-- |
-- Create a value of 'ListLinuxSubscriptionInstances' 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:
--
-- 'filters', 'listLinuxSubscriptionInstances_filters' - An array of structures that you can use to filter the results to those
-- that match one or more sets of key-value pairs that you specify. For
-- example, you can filter by the name of @AmiID@ with an optional operator
-- to see subscriptions that match, partially match, or don\'t match a
-- certain Amazon Machine Image (AMI) ID.
--
-- The valid names for this filter are:
--
-- -   @AmiID@
--
-- -   @InstanceID@
--
-- -   @AccountID@
--
-- -   @Status@
--
-- -   @Region@
--
-- -   @UsageOperation@
--
-- -   @ProductCode@
--
-- -   @InstanceType@
--
-- The valid Operators for this filter are:
--
-- -   @contains@
--
-- -   @equals@
--
-- -   @Notequal@
--
-- 'maxResults', 'listLinuxSubscriptionInstances_maxResults' - Maximum number of results to return in a single call.
--
-- 'nextToken', 'listLinuxSubscriptionInstances_nextToken' - Token for the next set of results.
newListLinuxSubscriptionInstances ::
  ListLinuxSubscriptionInstances
newListLinuxSubscriptionInstances :: ListLinuxSubscriptionInstances
newListLinuxSubscriptionInstances =
  ListLinuxSubscriptionInstances'
    { $sel:filters:ListLinuxSubscriptionInstances' :: Maybe [Filter]
filters =
        forall a. Maybe a
Prelude.Nothing,
      $sel:maxResults:ListLinuxSubscriptionInstances' :: Maybe Int
maxResults = forall a. Maybe a
Prelude.Nothing,
      $sel:nextToken:ListLinuxSubscriptionInstances' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing
    }

-- | An array of structures that you can use to filter the results to those
-- that match one or more sets of key-value pairs that you specify. For
-- example, you can filter by the name of @AmiID@ with an optional operator
-- to see subscriptions that match, partially match, or don\'t match a
-- certain Amazon Machine Image (AMI) ID.
--
-- The valid names for this filter are:
--
-- -   @AmiID@
--
-- -   @InstanceID@
--
-- -   @AccountID@
--
-- -   @Status@
--
-- -   @Region@
--
-- -   @UsageOperation@
--
-- -   @ProductCode@
--
-- -   @InstanceType@
--
-- The valid Operators for this filter are:
--
-- -   @contains@
--
-- -   @equals@
--
-- -   @Notequal@
listLinuxSubscriptionInstances_filters :: Lens.Lens' ListLinuxSubscriptionInstances (Prelude.Maybe [Filter])
listLinuxSubscriptionInstances_filters :: Lens' ListLinuxSubscriptionInstances (Maybe [Filter])
listLinuxSubscriptionInstances_filters = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListLinuxSubscriptionInstances' {Maybe [Filter]
filters :: Maybe [Filter]
$sel:filters:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe [Filter]
filters} -> Maybe [Filter]
filters) (\s :: ListLinuxSubscriptionInstances
s@ListLinuxSubscriptionInstances' {} Maybe [Filter]
a -> ListLinuxSubscriptionInstances
s {$sel:filters:ListLinuxSubscriptionInstances' :: Maybe [Filter]
filters = Maybe [Filter]
a} :: ListLinuxSubscriptionInstances) 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 s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | Maximum number of results to return in a single call.
listLinuxSubscriptionInstances_maxResults :: Lens.Lens' ListLinuxSubscriptionInstances (Prelude.Maybe Prelude.Int)
listLinuxSubscriptionInstances_maxResults :: Lens' ListLinuxSubscriptionInstances (Maybe Int)
listLinuxSubscriptionInstances_maxResults = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListLinuxSubscriptionInstances' {Maybe Int
maxResults :: Maybe Int
$sel:maxResults:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe Int
maxResults} -> Maybe Int
maxResults) (\s :: ListLinuxSubscriptionInstances
s@ListLinuxSubscriptionInstances' {} Maybe Int
a -> ListLinuxSubscriptionInstances
s {$sel:maxResults:ListLinuxSubscriptionInstances' :: Maybe Int
maxResults = Maybe Int
a} :: ListLinuxSubscriptionInstances)

-- | Token for the next set of results.
listLinuxSubscriptionInstances_nextToken :: Lens.Lens' ListLinuxSubscriptionInstances (Prelude.Maybe Prelude.Text)
listLinuxSubscriptionInstances_nextToken :: Lens' ListLinuxSubscriptionInstances (Maybe Text)
listLinuxSubscriptionInstances_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListLinuxSubscriptionInstances' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListLinuxSubscriptionInstances
s@ListLinuxSubscriptionInstances' {} Maybe Text
a -> ListLinuxSubscriptionInstances
s {$sel:nextToken:ListLinuxSubscriptionInstances' :: Maybe Text
nextToken = Maybe Text
a} :: ListLinuxSubscriptionInstances)

instance Core.AWSPager ListLinuxSubscriptionInstances where
  page :: ListLinuxSubscriptionInstances
-> AWSResponse ListLinuxSubscriptionInstances
-> Maybe ListLinuxSubscriptionInstances
page ListLinuxSubscriptionInstances
rq AWSResponse ListLinuxSubscriptionInstances
rs
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse ListLinuxSubscriptionInstances
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' ListLinuxSubscriptionInstancesResponse (Maybe Text)
listLinuxSubscriptionInstancesResponse_nextToken
            forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a b. Prism (Maybe a) (Maybe b) a b
Lens._Just
        ) =
        forall a. Maybe a
Prelude.Nothing
    | forall a. AWSTruncated a => a -> Bool
Core.stop
        ( AWSResponse ListLinuxSubscriptionInstances
rs
            forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' ListLinuxSubscriptionInstancesResponse (Maybe [Instance])
listLinuxSubscriptionInstancesResponse_instances
            forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a b. Prism (Maybe a) (Maybe b) a b
Lens._Just
        ) =
        forall a. Maybe a
Prelude.Nothing
    | Bool
Prelude.otherwise =
        forall a. a -> Maybe a
Prelude.Just
          forall a b. (a -> b) -> a -> b
Prelude.$ ListLinuxSubscriptionInstances
rq
          forall a b. a -> (a -> b) -> b
Prelude.& Lens' ListLinuxSubscriptionInstances (Maybe Text)
listLinuxSubscriptionInstances_nextToken
          forall s t a b. ASetter s t a b -> b -> s -> t
Lens..~ AWSResponse ListLinuxSubscriptionInstances
rs
          forall s a. s -> Getting (First a) s a -> Maybe a
Lens.^? Lens' ListLinuxSubscriptionInstancesResponse (Maybe Text)
listLinuxSubscriptionInstancesResponse_nextToken
          forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall a b. Prism (Maybe a) (Maybe b) a b
Lens._Just

instance
  Core.AWSRequest
    ListLinuxSubscriptionInstances
  where
  type
    AWSResponse ListLinuxSubscriptionInstances =
      ListLinuxSubscriptionInstancesResponse
  request :: (Service -> Service)
-> ListLinuxSubscriptionInstances
-> Request ListLinuxSubscriptionInstances
request Service -> Service
overrides =
    forall a. (ToRequest a, ToJSON a) => Service -> a -> Request a
Request.postJSON (Service -> Service
overrides Service
defaultService)
  response :: forall (m :: * -> *).
MonadResource m =>
(ByteStringLazy -> IO ByteStringLazy)
-> Service
-> Proxy ListLinuxSubscriptionInstances
-> ClientResponse ClientBody
-> m (Either
        Error
        (ClientResponse (AWSResponse ListLinuxSubscriptionInstances)))
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 [Instance]
-> Maybe Text -> Int -> ListLinuxSubscriptionInstancesResponse
ListLinuxSubscriptionInstancesResponse'
            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
"Instances" forall (f :: * -> *) a. Functor f => f (Maybe a) -> a -> f a
Core..!@ forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Either String (Maybe a)
Data..?> Key
"NextToken")
            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
    ListLinuxSubscriptionInstances
  where
  hashWithSalt :: Int -> ListLinuxSubscriptionInstances -> Int
hashWithSalt
    Int
_salt
    ListLinuxSubscriptionInstances' {Maybe Int
Maybe [Filter]
Maybe Text
nextToken :: Maybe Text
maxResults :: Maybe Int
filters :: Maybe [Filter]
$sel:nextToken:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe Text
$sel:maxResults:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe Int
$sel:filters:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe [Filter]
..} =
      Int
_salt
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [Filter]
filters
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Int
maxResults
        forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
nextToken

instance
  Prelude.NFData
    ListLinuxSubscriptionInstances
  where
  rnf :: ListLinuxSubscriptionInstances -> ()
rnf ListLinuxSubscriptionInstances' {Maybe Int
Maybe [Filter]
Maybe Text
nextToken :: Maybe Text
maxResults :: Maybe Int
filters :: Maybe [Filter]
$sel:nextToken:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe Text
$sel:maxResults:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe Int
$sel:filters:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe [Filter]
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe [Filter]
filters
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Int
maxResults
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
nextToken

instance
  Data.ToHeaders
    ListLinuxSubscriptionInstances
  where
  toHeaders :: ListLinuxSubscriptionInstances -> ResponseHeaders
toHeaders =
    forall a b. a -> b -> a
Prelude.const
      ( forall a. Monoid a => [a] -> a
Prelude.mconcat
          [ HeaderName
"Content-Type"
              forall a. ToHeader a => HeaderName -> a -> ResponseHeaders
Data.=# ( ByteString
"application/x-amz-json-1.1" ::
                          Prelude.ByteString
                      )
          ]
      )

instance Data.ToJSON ListLinuxSubscriptionInstances where
  toJSON :: ListLinuxSubscriptionInstances -> Value
toJSON ListLinuxSubscriptionInstances' {Maybe Int
Maybe [Filter]
Maybe Text
nextToken :: Maybe Text
maxResults :: Maybe Int
filters :: Maybe [Filter]
$sel:nextToken:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe Text
$sel:maxResults:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe Int
$sel:filters:ListLinuxSubscriptionInstances' :: ListLinuxSubscriptionInstances -> Maybe [Filter]
..} =
    [Pair] -> Value
Data.object
      ( forall a. [Maybe a] -> [a]
Prelude.catMaybes
          [ (Key
"Filters" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe [Filter]
filters,
            (Key
"MaxResults" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Int
maxResults,
            (Key
"NextToken" forall kv v. (KeyValue kv, ToJSON v) => Key -> v -> kv
Data..=) forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> Maybe Text
nextToken
          ]
      )

instance Data.ToPath ListLinuxSubscriptionInstances where
  toPath :: ListLinuxSubscriptionInstances -> ByteString
toPath =
    forall a b. a -> b -> a
Prelude.const
      ByteString
"/subscription/ListLinuxSubscriptionInstances"

instance Data.ToQuery ListLinuxSubscriptionInstances where
  toQuery :: ListLinuxSubscriptionInstances -> QueryString
toQuery = forall a b. a -> b -> a
Prelude.const forall a. Monoid a => a
Prelude.mempty

-- | /See:/ 'newListLinuxSubscriptionInstancesResponse' smart constructor.
data ListLinuxSubscriptionInstancesResponse = ListLinuxSubscriptionInstancesResponse'
  { -- | An array that contains instance objects.
    ListLinuxSubscriptionInstancesResponse -> Maybe [Instance]
instances :: Prelude.Maybe [Instance],
    -- | Token for the next set of results.
    ListLinuxSubscriptionInstancesResponse -> Maybe Text
nextToken :: Prelude.Maybe Prelude.Text,
    -- | The response's http status code.
    ListLinuxSubscriptionInstancesResponse -> Int
httpStatus :: Prelude.Int
  }
  deriving (ListLinuxSubscriptionInstancesResponse
-> ListLinuxSubscriptionInstancesResponse -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: ListLinuxSubscriptionInstancesResponse
-> ListLinuxSubscriptionInstancesResponse -> Bool
$c/= :: ListLinuxSubscriptionInstancesResponse
-> ListLinuxSubscriptionInstancesResponse -> Bool
== :: ListLinuxSubscriptionInstancesResponse
-> ListLinuxSubscriptionInstancesResponse -> Bool
$c== :: ListLinuxSubscriptionInstancesResponse
-> ListLinuxSubscriptionInstancesResponse -> Bool
Prelude.Eq, ReadPrec [ListLinuxSubscriptionInstancesResponse]
ReadPrec ListLinuxSubscriptionInstancesResponse
Int -> ReadS ListLinuxSubscriptionInstancesResponse
ReadS [ListLinuxSubscriptionInstancesResponse]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [ListLinuxSubscriptionInstancesResponse]
$creadListPrec :: ReadPrec [ListLinuxSubscriptionInstancesResponse]
readPrec :: ReadPrec ListLinuxSubscriptionInstancesResponse
$creadPrec :: ReadPrec ListLinuxSubscriptionInstancesResponse
readList :: ReadS [ListLinuxSubscriptionInstancesResponse]
$creadList :: ReadS [ListLinuxSubscriptionInstancesResponse]
readsPrec :: Int -> ReadS ListLinuxSubscriptionInstancesResponse
$creadsPrec :: Int -> ReadS ListLinuxSubscriptionInstancesResponse
Prelude.Read, Int -> ListLinuxSubscriptionInstancesResponse -> ShowS
[ListLinuxSubscriptionInstancesResponse] -> ShowS
ListLinuxSubscriptionInstancesResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [ListLinuxSubscriptionInstancesResponse] -> ShowS
$cshowList :: [ListLinuxSubscriptionInstancesResponse] -> ShowS
show :: ListLinuxSubscriptionInstancesResponse -> String
$cshow :: ListLinuxSubscriptionInstancesResponse -> String
showsPrec :: Int -> ListLinuxSubscriptionInstancesResponse -> ShowS
$cshowsPrec :: Int -> ListLinuxSubscriptionInstancesResponse -> ShowS
Prelude.Show, forall x.
Rep ListLinuxSubscriptionInstancesResponse x
-> ListLinuxSubscriptionInstancesResponse
forall x.
ListLinuxSubscriptionInstancesResponse
-> Rep ListLinuxSubscriptionInstancesResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x.
Rep ListLinuxSubscriptionInstancesResponse x
-> ListLinuxSubscriptionInstancesResponse
$cfrom :: forall x.
ListLinuxSubscriptionInstancesResponse
-> Rep ListLinuxSubscriptionInstancesResponse x
Prelude.Generic)

-- |
-- Create a value of 'ListLinuxSubscriptionInstancesResponse' 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:
--
-- 'instances', 'listLinuxSubscriptionInstancesResponse_instances' - An array that contains instance objects.
--
-- 'nextToken', 'listLinuxSubscriptionInstancesResponse_nextToken' - Token for the next set of results.
--
-- 'httpStatus', 'listLinuxSubscriptionInstancesResponse_httpStatus' - The response's http status code.
newListLinuxSubscriptionInstancesResponse ::
  -- | 'httpStatus'
  Prelude.Int ->
  ListLinuxSubscriptionInstancesResponse
newListLinuxSubscriptionInstancesResponse :: Int -> ListLinuxSubscriptionInstancesResponse
newListLinuxSubscriptionInstancesResponse
  Int
pHttpStatus_ =
    ListLinuxSubscriptionInstancesResponse'
      { $sel:instances:ListLinuxSubscriptionInstancesResponse' :: Maybe [Instance]
instances =
          forall a. Maybe a
Prelude.Nothing,
        $sel:nextToken:ListLinuxSubscriptionInstancesResponse' :: Maybe Text
nextToken = forall a. Maybe a
Prelude.Nothing,
        $sel:httpStatus:ListLinuxSubscriptionInstancesResponse' :: Int
httpStatus = Int
pHttpStatus_
      }

-- | An array that contains instance objects.
listLinuxSubscriptionInstancesResponse_instances :: Lens.Lens' ListLinuxSubscriptionInstancesResponse (Prelude.Maybe [Instance])
listLinuxSubscriptionInstancesResponse_instances :: Lens' ListLinuxSubscriptionInstancesResponse (Maybe [Instance])
listLinuxSubscriptionInstancesResponse_instances = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListLinuxSubscriptionInstancesResponse' {Maybe [Instance]
instances :: Maybe [Instance]
$sel:instances:ListLinuxSubscriptionInstancesResponse' :: ListLinuxSubscriptionInstancesResponse -> Maybe [Instance]
instances} -> Maybe [Instance]
instances) (\s :: ListLinuxSubscriptionInstancesResponse
s@ListLinuxSubscriptionInstancesResponse' {} Maybe [Instance]
a -> ListLinuxSubscriptionInstancesResponse
s {$sel:instances:ListLinuxSubscriptionInstancesResponse' :: Maybe [Instance]
instances = Maybe [Instance]
a} :: ListLinuxSubscriptionInstancesResponse) 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 s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | Token for the next set of results.
listLinuxSubscriptionInstancesResponse_nextToken :: Lens.Lens' ListLinuxSubscriptionInstancesResponse (Prelude.Maybe Prelude.Text)
listLinuxSubscriptionInstancesResponse_nextToken :: Lens' ListLinuxSubscriptionInstancesResponse (Maybe Text)
listLinuxSubscriptionInstancesResponse_nextToken = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\ListLinuxSubscriptionInstancesResponse' {Maybe Text
nextToken :: Maybe Text
$sel:nextToken:ListLinuxSubscriptionInstancesResponse' :: ListLinuxSubscriptionInstancesResponse -> Maybe Text
nextToken} -> Maybe Text
nextToken) (\s :: ListLinuxSubscriptionInstancesResponse
s@ListLinuxSubscriptionInstancesResponse' {} Maybe Text
a -> ListLinuxSubscriptionInstancesResponse
s {$sel:nextToken:ListLinuxSubscriptionInstancesResponse' :: Maybe Text
nextToken = Maybe Text
a} :: ListLinuxSubscriptionInstancesResponse)

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

instance
  Prelude.NFData
    ListLinuxSubscriptionInstancesResponse
  where
  rnf :: ListLinuxSubscriptionInstancesResponse -> ()
rnf ListLinuxSubscriptionInstancesResponse' {Int
Maybe [Instance]
Maybe Text
httpStatus :: Int
nextToken :: Maybe Text
instances :: Maybe [Instance]
$sel:httpStatus:ListLinuxSubscriptionInstancesResponse' :: ListLinuxSubscriptionInstancesResponse -> Int
$sel:nextToken:ListLinuxSubscriptionInstancesResponse' :: ListLinuxSubscriptionInstancesResponse -> Maybe Text
$sel:instances:ListLinuxSubscriptionInstancesResponse' :: ListLinuxSubscriptionInstancesResponse -> Maybe [Instance]
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe [Instance]
instances
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
nextToken
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Int
httpStatus