Merge branch 'master-ghc8107' into master-android
This commit is contained in:
commit
02db38ffd3
@ -15,7 +15,7 @@
|
|||||||
module Simplex.Chat where
|
module Simplex.Chat where
|
||||||
|
|
||||||
import Control.Applicative (optional, (<|>))
|
import Control.Applicative (optional, (<|>))
|
||||||
import Control.Concurrent.STM (retry, stateTVar)
|
import Control.Concurrent.STM (retry)
|
||||||
import Control.Logger.Simple
|
import Control.Logger.Simple
|
||||||
import Control.Monad.Except
|
import Control.Monad.Except
|
||||||
import Control.Monad.IO.Unlift
|
import Control.Monad.IO.Unlift
|
||||||
|
@ -10,7 +10,6 @@
|
|||||||
|
|
||||||
module Simplex.Chat.Store.Shared where
|
module Simplex.Chat.Store.Shared where
|
||||||
|
|
||||||
import Control.Concurrent.STM (stateTVar)
|
|
||||||
import Control.Exception (Exception)
|
import Control.Exception (Exception)
|
||||||
import qualified Control.Exception as E
|
import qualified Control.Exception as E
|
||||||
import Control.Monad.Except
|
import Control.Monad.Except
|
||||||
|
@ -2,7 +2,6 @@ module Simplex.Chat.Util (week, encryptFile, chunkSize) where
|
|||||||
|
|
||||||
import Control.Monad
|
import Control.Monad
|
||||||
import Control.Monad.Except
|
import Control.Monad.Except
|
||||||
import Control.Monad.IO.Class
|
|
||||||
import qualified Data.ByteString.Lazy as LB
|
import qualified Data.ByteString.Lazy as LB
|
||||||
import Data.Time (NominalDiffTime)
|
import Data.Time (NominalDiffTime)
|
||||||
import Simplex.Messaging.Crypto.File (CryptoFile (..), CryptoFileArgs (..))
|
import Simplex.Messaging.Crypto.File (CryptoFile (..), CryptoFileArgs (..))
|
||||||
|
@ -885,10 +885,10 @@ viewContactConnected ct userIncognitoProfile testView =
|
|||||||
|
|
||||||
viewGroupsList :: [(GroupInfo, GroupSummary)] -> [StyledString]
|
viewGroupsList :: [(GroupInfo, GroupSummary)] -> [StyledString]
|
||||||
viewGroupsList [] = ["you have no groups!", "to create: " <> highlight' "/g <name>"]
|
viewGroupsList [] = ["you have no groups!", "to create: " <> highlight' "/g <name>"]
|
||||||
viewGroupsList gs = map groupSS $ sortOn ldn_ gs
|
viewGroupsList gs = map groupSS $ sortOn (ldn_ . fst) gs
|
||||||
where
|
where
|
||||||
ldn_ :: GroupInfo -> Text
|
ldn_ :: GroupInfo -> Text
|
||||||
ldn_ = T.toLower . (localDisplayName :: GroupInfo -> GroupName) . fst
|
ldn_ = T.toLower . (localDisplayName :: GroupInfo -> GroupName)
|
||||||
groupSS (g@GroupInfo {membership, chatSettings = ChatSettings {enableNtfs}}, GroupSummary {currentMembers}) =
|
groupSS (g@GroupInfo {membership, chatSettings = ChatSettings {enableNtfs}}, GroupSummary {currentMembers}) =
|
||||||
case memberStatus membership of
|
case memberStatus membership of
|
||||||
GSMemInvited -> groupInvitation' g
|
GSMemInvited -> groupInvitation' g
|
||||||
|
Loading…
Reference in New Issue
Block a user