{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric      #-}
{-# LANGUAGE OverloadedStrings  #-}
{-# LANGUAGE RecordWildCards    #-}
{-# LANGUAGE TypeFamilies       #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-binds   #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}
module Network.AWS.SES.DeleteConfigurationSetEventDestination
    (
    
      deleteConfigurationSetEventDestination
    , DeleteConfigurationSetEventDestination
    
    , dcsedConfigurationSetName
    , dcsedEventDestinationName
    
    , deleteConfigurationSetEventDestinationResponse
    , DeleteConfigurationSetEventDestinationResponse
    
    , dcsedrsResponseStatus
    ) where
import           Network.AWS.Lens
import           Network.AWS.Prelude
import           Network.AWS.Request
import           Network.AWS.Response
import           Network.AWS.SES.Types
import           Network.AWS.SES.Types.Product
data DeleteConfigurationSetEventDestination = DeleteConfigurationSetEventDestination'
    { _dcsedConfigurationSetName :: !Text
    , _dcsedEventDestinationName :: !Text
    } deriving (Eq,Read,Show,Data,Typeable,Generic)
deleteConfigurationSetEventDestination
    :: Text 
    -> Text 
    -> DeleteConfigurationSetEventDestination
deleteConfigurationSetEventDestination pConfigurationSetName_ pEventDestinationName_ =
    DeleteConfigurationSetEventDestination'
    { _dcsedConfigurationSetName = pConfigurationSetName_
    , _dcsedEventDestinationName = pEventDestinationName_
    }
dcsedConfigurationSetName :: Lens' DeleteConfigurationSetEventDestination Text
dcsedConfigurationSetName = lens _dcsedConfigurationSetName (\ s a -> s{_dcsedConfigurationSetName = a});
dcsedEventDestinationName :: Lens' DeleteConfigurationSetEventDestination Text
dcsedEventDestinationName = lens _dcsedEventDestinationName (\ s a -> s{_dcsedEventDestinationName = a});
instance AWSRequest
         DeleteConfigurationSetEventDestination where
        type Rs DeleteConfigurationSetEventDestination =
             DeleteConfigurationSetEventDestinationResponse
        request = postQuery ses
        response
          = receiveXMLWrapper
              "DeleteConfigurationSetEventDestinationResult"
              (\ s h x ->
                 DeleteConfigurationSetEventDestinationResponse' <$>
                   (pure (fromEnum s)))
instance Hashable
         DeleteConfigurationSetEventDestination
instance NFData
         DeleteConfigurationSetEventDestination
instance ToHeaders
         DeleteConfigurationSetEventDestination where
        toHeaders = const mempty
instance ToPath
         DeleteConfigurationSetEventDestination where
        toPath = const "/"
instance ToQuery
         DeleteConfigurationSetEventDestination where
        toQuery DeleteConfigurationSetEventDestination'{..}
          = mconcat
              ["Action" =:
                 ("DeleteConfigurationSetEventDestination" ::
                    ByteString),
               "Version" =: ("2010-12-01" :: ByteString),
               "ConfigurationSetName" =: _dcsedConfigurationSetName,
               "EventDestinationName" =: _dcsedEventDestinationName]
newtype DeleteConfigurationSetEventDestinationResponse = DeleteConfigurationSetEventDestinationResponse'
    { _dcsedrsResponseStatus :: Int
    } deriving (Eq,Read,Show,Data,Typeable,Generic)
deleteConfigurationSetEventDestinationResponse
    :: Int 
    -> DeleteConfigurationSetEventDestinationResponse
deleteConfigurationSetEventDestinationResponse pResponseStatus_ =
    DeleteConfigurationSetEventDestinationResponse'
    { _dcsedrsResponseStatus = pResponseStatus_
    }
dcsedrsResponseStatus :: Lens' DeleteConfigurationSetEventDestinationResponse Int
dcsedrsResponseStatus = lens _dcsedrsResponseStatus (\ s a -> s{_dcsedrsResponseStatus = a});
instance NFData
         DeleteConfigurationSetEventDestinationResponse