{-# OPTIONS_HADDOCK hide #-} -- | -- Module : Network.TLS.Core -- License : BSD-style -- Maintainer : Vincent Hanquez -- Stability : experimental -- Portability : unknown -- module Network.TLS.Core ( -- * Context configuration TLSParams(..) , TLSLogging(..) , TLSCertificateUsage(..) , TLSCertificateRejectReason(..) , defaultLogging , defaultParams -- * Context object , TLSCtx , ctxConnection , ctxEOF -- * Internal packet sending and receiving , sendPacket , recvPacket -- * Creating a context , client , clientWith , server , serverWith -- * Initialisation and Termination of context , bye , handshake -- * High level API , sendData , recvData ) where import Network.TLS.Struct import Network.TLS.Record import Network.TLS.Cipher import Network.TLS.Compression import Network.TLS.Crypto import Network.TLS.Packet import Network.TLS.State import Network.TLS.Sending import Network.TLS.Receiving import Data.Maybe import Data.Certificate.X509 import Data.List (intersect, intercalate, find) import qualified Data.ByteString as B import qualified Data.ByteString.Lazy as L import Crypto.Random import Control.Applicative ((<$>)) import Control.Concurrent.MVar import Control.Monad.State import Control.Exception (throwIO, Exception(), onException, fromException, catch) import Data.IORef import System.IO (Handle, hSetBuffering, BufferMode(..), hFlush) import System.IO.Error (mkIOError, eofErrorType) import Prelude hiding (catch) data TLSLogging = TLSLogging { loggingPacketSent :: String -> IO () , loggingPacketRecv :: String -> IO () , loggingIOSent :: Bytes -> IO () , loggingIORecv :: Header -> Bytes -> IO () } -- | Certificate and Chain rejection reason data TLSCertificateRejectReason = CertificateRejectExpired | CertificateRejectRevoked | CertificateRejectUnknownCA | CertificateRejectOther String deriving (Show,Eq) -- | Certificate Usage callback possible returns values. data TLSCertificateUsage = CertificateUsageAccept -- ^ usage of certificate accepted | CertificateUsageReject TLSCertificateRejectReason -- ^ usage of certificate rejected deriving (Show,Eq) data TLSParams = TLSParams { pConnectVersion :: Version -- ^ version to use on client connection. , pAllowedVersions :: [Version] -- ^ allowed versions that we can use. , pCiphers :: [Cipher] -- ^ all ciphers supported ordered by priority. , pCompressions :: [Compression] -- ^ all compression supported ordered by priority. , pWantClientCert :: Bool -- ^ request a certificate from client. -- use by server only. , pUseSecureRenegotiation :: Bool -- notify that we want to use secure renegotation , pCertificates :: [(X509, Maybe PrivateKey)] -- ^ the cert chain for this context with the associated keys if any. , pLogging :: TLSLogging -- ^ callback for logging , onCertificatesRecv :: [X509] -> IO TLSCertificateUsage -- ^ callback to verify received cert chain. } defaultLogging :: TLSLogging defaultLogging = TLSLogging { loggingPacketSent = (\_ -> return ()) , loggingPacketRecv = (\_ -> return ()) , loggingIOSent = (\_ -> return ()) , loggingIORecv = (\_ _ -> return ()) } defaultParams :: TLSParams defaultParams = TLSParams { pConnectVersion = TLS10 , pAllowedVersions = [TLS10,TLS11,TLS12] , pCiphers = [] , pCompressions = [nullCompression] , pWantClientCert = False , pUseSecureRenegotiation = True , pCertificates = [] , pLogging = defaultLogging , onCertificatesRecv = (\_ -> return CertificateUsageAccept) } instance Show TLSParams where show p = "TLSParams { " ++ (intercalate "," $ map (\(k,v) -> k ++ "=" ++ v) [ ("connectVersion", show $ pConnectVersion p) , ("allowedVersions", show $ pAllowedVersions p) , ("ciphers", show $ pCiphers p) , ("compressions", show $ pCompressions p) , ("want-client-cert", show $ pWantClientCert p) , ("certificates", show $ length $ pCertificates p) ]) ++ " }" -- | A TLS Context is a handle augmented by tls specific state and parameters data TLSCtx a = TLSCtx { ctxConnection :: a -- ^ return the connection object associated with this context , ctxParams :: TLSParams , ctxState :: MVar TLSState , ctxEOF_ :: IORef Bool -- ^ is the handle has EOFed or not. , ctxConnectionFlush :: IO () , ctxConnectionSend :: Bytes -> IO () , ctxConnectionRecv :: Int -> IO Bytes } connectionFlush :: TLSCtx c -> IO () connectionFlush c = (ctxConnectionFlush c) connectionSend :: TLSCtx c -> Bytes -> IO () connectionSend c b = (ctxConnectionSend c) b connectionRecv :: TLSCtx c -> Int -> IO Bytes connectionRecv c sz = (ctxConnectionRecv c) sz ctxEOF :: MonadIO m => TLSCtx a -> m Bool ctxEOF ctx = liftIO (readIORef $ ctxEOF_ ctx) throwCore :: (MonadIO m, Exception e) => e -> m a throwCore = liftIO . throwIO newCtxWith :: c -> IO () -> (Bytes -> IO ()) -> (Int -> IO Bytes) -> TLSParams -> TLSState -> IO (TLSCtx c) newCtxWith c flushF sendF recvF params st = do stvar <- newMVar st eof <- newIORef False return $ TLSCtx { ctxConnection = c , ctxParams = params , ctxState = stvar , ctxEOF_ = eof , ctxConnectionFlush = flushF , ctxConnectionSend = sendF , ctxConnectionRecv = recvF } newCtx :: Handle -> TLSParams -> TLSState -> IO (TLSCtx Handle) newCtx handle params st = do hSetBuffering handle NoBuffering newCtxWith handle (hFlush handle) (B.hPut handle) (B.hGet handle) params st ctxLogging :: TLSCtx a -> TLSLogging ctxLogging = pLogging . ctxParams usingState :: MonadIO m => TLSCtx c -> TLSSt a -> m (Either TLSError a) usingState ctx f = liftIO (takeMVar mvar) >>= \st -> liftIO $ onException (execAndStore st) (putMVar mvar st) where mvar = ctxState ctx execAndStore st = do let (a, newst) = runTLSState f st putMVar mvar newst return a usingState_ :: MonadIO m => TLSCtx c -> TLSSt a -> m a usingState_ ctx f = do ret <- usingState ctx f case ret of Left err -> throwCore err Right r -> return r getStateRNG :: MonadIO m => TLSCtx c -> Int -> m Bytes getStateRNG ctx n = usingState_ ctx (genTLSRandom n) whileStatus :: MonadIO m => TLSCtx c -> (TLSStatus -> Bool) -> m a -> m () whileStatus ctx p a = do b <- usingState_ ctx (p . stStatus <$> get) when b (a >> whileStatus ctx p a) errorToAlert :: TLSError -> Packet errorToAlert (Error_Protocol (_, _, ad)) = Alert [(AlertLevel_Fatal, ad)] errorToAlert _ = Alert [(AlertLevel_Fatal, InternalError)] setEOF :: MonadIO m => TLSCtx c -> m () setEOF ctx = liftIO $ writeIORef (ctxEOF_ ctx) True readExact :: MonadIO m => TLSCtx c -> Int -> m Bytes readExact ctx sz = do hdrbs <- liftIO $ connectionRecv ctx sz when (B.length hdrbs < sz) $ do setEOF ctx if B.null hdrbs then throwCore Error_EOF else throwCore (Error_Packet ("partial packet: expecting " ++ show sz ++ " bytes, got: " ++ (show $B.length hdrbs))) return hdrbs -- | receive one packet from the context that contains 1 or -- many messages (many only in case of handshake). if will returns a -- TLSError if the packet is unexpected or malformed recvPacket :: MonadIO m => TLSCtx c -> m (Either TLSError Packet) recvPacket ctx = do hdrbs <- readExact ctx 5 case decodeHeader hdrbs of Left err -> return $ Left err Right header@(Header _ _ readlen) -> if readlen > (16384 + 2048) then return $ Left $ Error_Protocol ("record exceeding maximum size",True, RecordOverflow) else recvLength header readlen where recvLength header readlen = do content <- readExact ctx (fromIntegral readlen) liftIO $ (loggingIORecv $ ctxLogging ctx) header content pkt <- usingState ctx $ readPacket $ rawToRecord header (fragmentCiphertext content) case pkt of Right p -> liftIO $ (loggingPacketRecv $ ctxLogging ctx) $ show p _ -> return () return pkt recvPacketSuccess :: MonadIO m => TLSCtx c -> m () recvPacketSuccess ctx = do pkt <- recvPacket ctx case pkt of Left err -> throwCore err Right _ -> return () -- | Send one packet to the context sendPacket :: MonadIO m => TLSCtx c -> Packet -> m () sendPacket ctx pkt = do liftIO $ (loggingPacketSent $ ctxLogging ctx) (show pkt) dataToSend <- usingState_ ctx $ writePacket pkt liftIO $ (loggingIOSent $ ctxLogging ctx) dataToSend liftIO $ connectionSend ctx dataToSend -- | Create a new Client context with a configuration, a RNG, a generic connection and the connection operation. clientWith :: (MonadIO m, CryptoRandomGen g) => TLSParams -> g -> c -> IO () -> (Bytes -> IO ()) -> (Int -> IO Bytes) -> m (TLSCtx c) clientWith params rng connection flushF sendF recvF = liftIO $ newCtxWith connection flushF sendF recvF params st where st = (newTLSState rng) { stClientContext = True } -- | Create a new Client context with a configuration, a RNG, and a Handle. -- It reconfigures the handle buffermode to noBuffering client :: (MonadIO m, CryptoRandomGen g) => TLSParams -> g -> Handle -> m (TLSCtx Handle) client params rng handle = liftIO $ newCtx handle params st where st = (newTLSState rng) { stClientContext = True } -- | Create a new Server context with a configuration, a RNG, a generic connection and the connection operation. serverWith :: (MonadIO m, CryptoRandomGen g) => TLSParams -> g -> c -> IO () -> (Bytes -> IO ()) -> (Int -> IO Bytes) -> m (TLSCtx c) serverWith params rng connection flushF sendF recvF = liftIO $ newCtxWith connection flushF sendF recvF params st where st = (newTLSState rng) { stClientContext = False } -- | Create a new Server context with a configuration, a RNG, and a Handle. -- It reconfigures the handle buffermode to noBuffering server :: (MonadIO m, CryptoRandomGen g) => TLSParams -> g -> Handle -> m (TLSCtx Handle) server params rng handle = liftIO $ newCtx handle params st where st = (newTLSState rng) { stClientContext = False } -- | notify the context that this side wants to close connection. -- this is important that it is called before closing the handle, otherwise -- the session might not be resumable (for version < TLS1.2). -- -- this doesn't actually close the handle bye :: MonadIO m => TLSCtx c -> m () bye ctx = sendPacket ctx $ Alert [(AlertLevel_Warning, CloseNotify)] -- client part of handshake. send a bunch of handshake of client -- values intertwined with response from the server. handshakeClient :: MonadIO m => TLSCtx c -> m () handshakeClient ctx = do -- Send ClientHello crand <- getStateRNG ctx 32 >>= return . ClientRandom extensions <- getExtensions usingState_ ctx (startHandshakeClient ver crand) sendPacket ctx $ Handshake [ ClientHello ver crand (Session Nothing) (map cipherID ciphers) (map compressionID compressions) extensions ] -- Receive Server information until ServerHelloDone whileStatus ctx (/= (StatusHandshake HsStatusServerHelloDone)) $ do pkts <- recvPacket ctx case pkts of Left err -> throwCore err Right l -> processServerInfo l -- Send Certificate if requested. XXX disabled for now. certRequested <- return False when certRequested (sendPacket ctx $ Handshake [Certificates clientCerts]) sendClientKeyXchg {- maybe send certificateVerify -} {- FIXME not implemented yet -} sendPacket ctx ChangeCipherSpec liftIO $ connectionFlush ctx -- Send Finished cf <- usingState_ ctx $ getHandshakeDigest True sendPacket ctx (Handshake [Finished cf]) -- receive changeCipherSpec & Finished recvPacketSuccess ctx >> recvPacketSuccess ctx >> return () where params = ctxParams ctx ver = pConnectVersion params allowedvers = pAllowedVersions params ciphers = pCiphers params compressions = pCompressions params clientCerts = map fst $ pCertificates params getExtensions = if pUseSecureRenegotiation params then usingState_ ctx (getVerifiedData True) >>= \vd -> return [ (0xff01, encodeExtSecureRenegotiation vd Nothing) ] else return [] processServerInfo (Handshake hss) = mapM_ processHandshake hss processServerInfo _ = return () processHandshake (ServerHello rver _ _ cipher _ _) = do when (rver == SSL2) $ throwCore $ Error_Protocol ("ssl2 is not supported", True, ProtocolVersion) case find ((==) rver) allowedvers of Nothing -> throwCore $ Error_Protocol ("version " ++ show ver ++ "is not supported", True, ProtocolVersion) Just _ -> usingState_ ctx $ setVersion ver case find ((==) cipher . cipherID) ciphers of Nothing -> throwCore $ Error_Protocol ("no cipher in common with the server", True, HandshakeFailure) Just c -> usingState_ ctx $ setCipher c processHandshake (Certificates certs) = do let cb = onCertificatesRecv $ params usage <- liftIO $ cb certs case usage of CertificateUsageAccept -> return () CertificateUsageReject reason -> certificateRejected reason processHandshake (CertRequest _ _ _) = do return () --modify (\sc -> sc { scCertRequested = True }) processHandshake _ = return () sendClientKeyXchg = do prerand <- getStateRNG ctx 46 >>= return . ClientKeyData sendPacket ctx $ Handshake [ClientKeyXchg ver prerand] -- on certificate reject, throw an exception with the proper protocol alert error. certificateRejected CertificateRejectRevoked = throwCore $ Error_Protocol ("certificate is revoked", True, CertificateRevoked) certificateRejected CertificateRejectExpired = throwCore $ Error_Protocol ("certificate has expired", True, CertificateExpired) certificateRejected CertificateRejectUnknownCA = throwCore $ Error_Protocol ("certificate has unknown CA", True, UnknownCa) certificateRejected (CertificateRejectOther s) = throwCore $ Error_Protocol ("certificate rejected: " ++ s, True, CertificateUnknown) handshakeServerWith :: MonadIO m => TLSCtx c -> Handshake -> m () handshakeServerWith ctx (ClientHello ver _ _ ciphers compressions _) = do -- Handle Client hello when (ver == SSL2) $ throwCore $ Error_Protocol ("ssl2 is not supported", True, ProtocolVersion) when (not $ elem ver (pAllowedVersions params)) $ throwCore $ Error_Protocol ("version " ++ show ver ++ "is not supported", True, ProtocolVersion) when (commonCiphers == []) $ throwCore $ Error_Protocol ("no cipher in common with the client", True, HandshakeFailure) when (null commonCompressions) $ throwCore $ Error_Protocol ("no compression in common with the client", True, HandshakeFailure) usingState_ ctx $ modify (\st -> st { stVersion = ver , stCipher = Just usedCipher , stCompression = usedCompression }) -- send Server Data until ServerHelloDone handshakeSendServerData liftIO $ connectionFlush ctx -- Receive client info until client Finished. whileStatus ctx (/= (StatusHandshake HsStatusClientFinished)) (recvPacketSuccess ctx) sendPacket ctx ChangeCipherSpec -- Send Finish cf <- usingState_ ctx $ getHandshakeDigest False sendPacket ctx (Handshake [Finished cf]) liftIO $ connectionFlush ctx return () where params = ctxParams ctx commonCiphers = intersect ciphers (map cipherID $ pCiphers params) usedCipher = fromJust $ find (\c -> cipherID c == head commonCiphers) (pCiphers params) commonCompressions = compressionIntersectID (pCompressions params) compressions usedCompression = head commonCompressions srvCerts = map fst $ pCertificates params privKeys = map snd $ pCertificates params needKeyXchg = cipherExchangeNeedMoreData $ cipherKeyExchange usedCipher handshakeSendServerData = do srand <- getStateRNG ctx 32 >>= return . ServerRandom case privKeys of (Just privkey : _) -> usingState_ ctx $ setPrivateKey privkey _ -> return () -- return a sensible error -- in TLS12, we need to check as well the certificates we are sending if they have in the extension -- the necessary bits set. -- send ServerHello & Certificate & ServerKeyXchg & CertReq secReneg <- usingState_ ctx getSecureRenegotiation extensions <- if secReneg then do vf <- usingState_ ctx $ do cvf <- getVerifiedData True svf <- getVerifiedData False return $ encodeExtSecureRenegotiation cvf (Just svf) return [ (0xff01, vf) ] else return [] usingState_ ctx (setVersion ver >> setServerRandom srand) sendPacket ctx $ Handshake [ ServerHello ver srand (Session Nothing) (cipherID usedCipher) (compressionID usedCompression) extensions , Certificates srvCerts ] when needKeyXchg $ do let skg = SKX_RSA Nothing sendPacket ctx (Handshake [ServerKeyXchg skg]) -- FIXME we don't do this on a Anonymous server when (pWantClientCert params) $ do let certTypes = [ CertificateType_RSA_Sign ] let creq = CertRequest certTypes Nothing [0,0,0] sendPacket ctx (Handshake [creq]) -- Send HelloDone sendPacket ctx (Handshake [ServerHelloDone]) handshakeServerWith _ _ = fail "unexpected handshake type received. expecting client hello" -- after receiving a client hello, we need to redo a handshake -} handshakeServer :: MonadIO m => TLSCtx c -> m () handshakeServer ctx = do pkts <- recvPacket ctx case pkts of Right (Handshake [hs]) -> handshakeServerWith ctx hs x -> fail ("unexpected type received. expecting handshake ++ " ++ show x) -- | Handshake for a new TLS connection -- This is to be called at the beginning of a connection, and during renegociation handshake :: MonadIO m => TLSCtx c -> m Bool handshake ctx = do cc <- usingState_ ctx (stClientContext <$> get) liftIO $ handleException $ if cc then handshakeClient ctx else handshakeServer ctx where handleException f = catch (f >> return True) (\e -> handler e >> return False) handler e = case fromException e of Just err -> sendPacket ctx (errorToAlert err) Nothing -> sendPacket ctx (errorToAlert $ Error_Misc "") -- | sendData sends a bunch of data. -- It will automatically chunk data to acceptable packet size sendData :: MonadIO m => TLSCtx c -> L.ByteString -> m () sendData ctx dataToSend = do eofed <- ctxEOF ctx when eofed $ liftIO $ throwIO $ mkIOError eofErrorType "sendData" Nothing Nothing mapM_ sendDataChunk (L.toChunks dataToSend) where sendDataChunk d = if B.length d > 16384 then do let (sending, remain) = B.splitAt 16384 d sendPacket ctx $ AppData sending sendDataChunk remain else sendPacket ctx $ AppData d -- | recvData get data out of Data packet, and automatically renegociate if -- a Handshake ClientHello is received recvData :: MonadIO m => TLSCtx c -> m L.ByteString recvData ctx = do eofed <- ctxEOF ctx when eofed $ liftIO $ throwIO $ mkIOError eofErrorType "recvData" Nothing Nothing pkt <- recvPacket ctx case pkt of -- on server context receiving a client hello == renegociation Right (Handshake [ch@(ClientHello _ _ _ _ _ _)]) -> handshakeServerWith ctx ch >> recvData ctx -- on client context, receiving a hello request == renegociation Right (Handshake [HelloRequest]) -> handshakeClient ctx >> recvData ctx Right (Alert [(AlertLevel_Fatal, _)]) -> do setEOF ctx return L.empty Right (Alert [(AlertLevel_Warning, CloseNotify)]) -> do setEOF ctx return L.empty Right (AppData x) -> return $ L.fromChunks [x] Right p -> error ("error unexpected packet: " ++ show p) Left err -> error ("error received: " ++ show err)