{-# LANGUAGE DeriveDataTypeable    #-}
{-# LANGUAGE DeriveGeneric         #-}
{-# LANGUAGE FlexibleContexts      #-}
{-# LANGUAGE FlexibleInstances     #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE OverloadedLists       #-}
{-# LANGUAGE OverloadedStrings     #-}
{-# LANGUAGE MultiWayIf            #-}
{-# LANGUAGE PackageImports        #-}
{-# LANGUAGE RecordWildCards       #-}
{-# LANGUAGE ScopedTypeVariables   #-}
{-# LANGUAGE TypeFamilies          #-}
{-# LANGUAGE QuasiQuotes           #-}
module Data.SAM.Version1_6.Read.Parser.Header.RG.LB ( 
                                                      parse_SAM_V1_6_Read_Group_LB
                                                    ) where
import Data.SAM.Version1_6.Header
import Data.SAM.Version1_6.Read.Error
import Data.Attoparsec.ByteString.Char8 (isEndOfLine)
import Data.Attoparsec.ByteString.Lazy as DABL
import Text.Regex.PCRE.Heavy
parse_SAM_V1_6_Read_Group_LB :: Parser SAM_V1_6_Read_Group_Library 
parse_SAM_V1_6_Read_Group_LB :: Parser SAM_V1_6_Read_Group_Library
parse_SAM_V1_6_Read_Group_LB = do
  ()
_ <- do ByteString
rgheaderlibrarytagp <- (Word8 -> Bool) -> Parser ByteString
DABL.takeTill (Word8 -> Word8 -> Bool
forall a. Eq a => a -> a -> Bool
== Word8
58)
          
          case (ByteString
rgheaderlibrarytagp ByteString -> Regex -> Bool
forall a. ConvertibleStrings a ByteString => a -> Regex -> Bool
=~ [re|[L][B]|]) of
            Bool
False -> String -> Parser ByteString ()
forall a. String -> Parser ByteString a
forall (m :: * -> *) a. MonadFail m => String -> m a
fail (String -> Parser ByteString ()) -> String -> Parser ByteString ()
forall a b. (a -> b) -> a -> b
$ SAM_V1_6_Error -> String
forall a. Show a => a -> String
show SAM_V1_6_Error
SAM_V1_6_Error_Read_Group_Library_Incorrect_Format
            Bool
True  -> 
                     () -> Parser ByteString ()
forall a. a -> Parser ByteString a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
  Word8
_ <- Word8 -> Parser Word8
word8 Word8
58
  ByteString
rgheaderlibraryvalue <- (Word8 -> Bool) -> Parser ByteString
DABL.takeTill (\Word8
x -> Word8
x Word8 -> Word8 -> Bool
forall a. Eq a => a -> a -> Bool
== Word8
09 Bool -> Bool -> Bool
|| Word8 -> Bool
isEndOfLine Word8
x)
  SAM_V1_6_Read_Group_Library -> Parser SAM_V1_6_Read_Group_Library
forall a. a -> Parser ByteString a
forall (m :: * -> *) a. Monad m => a -> m a
return SAM_V1_6_Read_Group_Library { sam_v1_6_read_group_library_value :: ByteString
sam_v1_6_read_group_library_value = ByteString
rgheaderlibraryvalue
                                     }