mirror of
https://github.com/simplex-chat/simplex-chat.git
synced 2025-06-28 20:29:53 +00:00
* core: support encrypted local files * add migration * update agent api, chat api * fix query, exported functions to read/write files * update simplexmq * remove formatting changes * test, fix file size * reduce diff Co-authored-by: spaced4ndy <8711996+spaced4ndy@users.noreply.github.com> * fail when receiving SMP files with local encryption * update simplexmq * remove style changes --------- Co-authored-by: spaced4ndy <8711996+spaced4ndy@users.noreply.github.com>
1800 lines
97 KiB
Haskell
1800 lines
97 KiB
Haskell
{-# LANGUAGE DataKinds #-}
|
|
{-# LANGUAGE DeriveGeneric #-}
|
|
{-# LANGUAGE DuplicateRecordFields #-}
|
|
{-# LANGUAGE GADTs #-}
|
|
{-# LANGUAGE LambdaCase #-}
|
|
{-# LANGUAGE NamedFieldPuns #-}
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
{-# LANGUAGE ScopedTypeVariables #-}
|
|
{-# LANGUAGE TypeApplications #-}
|
|
|
|
module Simplex.Chat.View where
|
|
|
|
import Data.Aeson (ToJSON)
|
|
import qualified Data.Aeson as J
|
|
import qualified Data.ByteString.Char8 as B
|
|
import qualified Data.ByteString.Lazy.Char8 as LB
|
|
import Data.Char (toUpper)
|
|
import Data.Function (on)
|
|
import Data.Int (Int64)
|
|
import Data.List (groupBy, intercalate, intersperse, partition, sortOn)
|
|
import Data.List.NonEmpty (NonEmpty)
|
|
import qualified Data.List.NonEmpty as L
|
|
import qualified Data.Map.Strict as M
|
|
import Data.Maybe (fromMaybe, isJust, isNothing, mapMaybe)
|
|
import Data.Text (Text)
|
|
import qualified Data.Text as T
|
|
import Data.Text.Encoding (decodeLatin1)
|
|
import Data.Time (LocalTime (..), TimeOfDay (..), TimeZone (..), utcToLocalTime)
|
|
import Data.Time.Calendar (addDays)
|
|
import Data.Time.Clock (UTCTime)
|
|
import Data.Time.Format (defaultTimeLocale, formatTime)
|
|
import GHC.Generics (Generic)
|
|
import qualified Network.HTTP.Types as Q
|
|
import Numeric (showFFloat)
|
|
import Simplex.Chat (defaultChatConfig, maxImageSize)
|
|
import Simplex.Chat.Call
|
|
import Simplex.Chat.Controller
|
|
import Simplex.Chat.Help
|
|
import Simplex.Chat.Markdown
|
|
import Simplex.Chat.Messages hiding (NewChatItem (..))
|
|
import Simplex.Chat.Messages.CIContent
|
|
import Simplex.Chat.Protocol
|
|
import Simplex.Chat.Store (AutoAccept (..), StoreError (..), UserContactLink (..))
|
|
import Simplex.Chat.Styled
|
|
import Simplex.Chat.Types
|
|
import Simplex.Chat.Types.Preferences
|
|
import qualified Simplex.FileTransfer.Protocol as XFTP
|
|
import Simplex.Messaging.Agent.Client (ProtocolTestFailure (..), ProtocolTestStep (..), SubscriptionsInfo (..))
|
|
import Simplex.Messaging.Agent.Env.SQLite (NetworkConfig (..))
|
|
import Simplex.Messaging.Agent.Protocol
|
|
import Simplex.Messaging.Agent.Store.SQLite.DB (SlowQueryStats (..))
|
|
import qualified Simplex.Messaging.Crypto as C
|
|
import Simplex.Messaging.Crypto.File (CryptoFile (..), CryptoFileArgs (..))
|
|
import Simplex.Messaging.Encoding
|
|
import Simplex.Messaging.Encoding.String
|
|
import Simplex.Messaging.Parsers (dropPrefix, taggedObjectJSON)
|
|
import Simplex.Messaging.Protocol (AProtoServerWithAuth (..), AProtocolType, ProtoServerWithAuth, ProtocolServer (..), ProtocolTypeI, SProtocolType (..))
|
|
import qualified Simplex.Messaging.Protocol as SMP
|
|
import Simplex.Messaging.Transport.Client (TransportHost (..))
|
|
import Simplex.Messaging.Util (bshow, tshow)
|
|
import System.Console.ANSI.Types
|
|
|
|
type CurrentTime = UTCTime
|
|
|
|
serializeChatResponse :: Maybe User -> CurrentTime -> TimeZone -> ChatResponse -> String
|
|
serializeChatResponse user_ ts tz = unlines . map unStyle . responseToView user_ defaultChatConfig False ts tz
|
|
|
|
responseToView :: Maybe User -> ChatConfig -> Bool -> CurrentTime -> TimeZone -> ChatResponse -> [StyledString]
|
|
responseToView user_ ChatConfig {logLevel, showReactions, showReceipts, testView} liveItems ts tz = \case
|
|
CRActiveUser User {profile} -> viewUserProfile $ fromLocalProfile profile
|
|
CRUsersList users -> viewUsersList users
|
|
CRChatStarted -> ["chat started"]
|
|
CRChatRunning -> ["chat is running"]
|
|
CRChatStopped -> ["chat stopped"]
|
|
CRChatSuspended -> ["chat suspended"]
|
|
CRApiChats u chats -> ttyUser u $ if testView then testViewChats chats else [plain . bshow $ J.encode chats]
|
|
CRChats chats -> viewChats ts tz chats
|
|
CRApiChat u chat -> ttyUser u $ if testView then testViewChat chat else [plain . bshow $ J.encode chat]
|
|
CRApiParsedMarkdown ft -> [plain . bshow $ J.encode ft]
|
|
CRUserProtoServers u userServers -> ttyUser u $ viewUserServers userServers testView
|
|
CRServerTestResult u srv testFailure -> ttyUser u $ viewServerTestResult srv testFailure
|
|
CRChatItemTTL u ttl -> ttyUser u $ viewChatItemTTL ttl
|
|
CRNetworkConfig cfg -> viewNetworkConfig cfg
|
|
CRContactInfo u ct cStats customUserProfile -> ttyUser u $ viewContactInfo ct cStats customUserProfile
|
|
CRGroupInfo u g s -> ttyUser u $ viewGroupInfo g s
|
|
CRGroupMemberInfo u g m cStats -> ttyUser u $ viewGroupMemberInfo g m cStats
|
|
CRContactSwitchStarted {} -> ["switch started"]
|
|
CRGroupMemberSwitchStarted {} -> ["switch started"]
|
|
CRContactSwitchAborted {} -> ["switch aborted"]
|
|
CRGroupMemberSwitchAborted {} -> ["switch aborted"]
|
|
CRContactSwitch u ct progress -> ttyUser u $ viewContactSwitch ct progress
|
|
CRGroupMemberSwitch u g m progress -> ttyUser u $ viewGroupMemberSwitch g m progress
|
|
CRContactRatchetSyncStarted {} -> ["connection synchronization started"]
|
|
CRGroupMemberRatchetSyncStarted {} -> ["connection synchronization started"]
|
|
CRContactRatchetSync u ct progress -> ttyUser u $ viewContactRatchetSync ct progress
|
|
CRGroupMemberRatchetSync u g m progress -> ttyUser u $ viewGroupMemberRatchetSync g m progress
|
|
CRContactVerificationReset u ct -> ttyUser u $ viewContactVerificationReset ct
|
|
CRGroupMemberVerificationReset u g m -> ttyUser u $ viewGroupMemberVerificationReset g m
|
|
CRConnectionVerified u verified code -> ttyUser u [plain $ if verified then "connection verified" else "connection not verified, current code is " <> code]
|
|
CRContactCode u ct code -> ttyUser u $ viewContactCode ct code testView
|
|
CRGroupMemberCode u g m code -> ttyUser u $ viewGroupMemberCode g m code testView
|
|
CRNewChatItem u (AChatItem _ _ chat item) -> ttyUser u $ unmuted chat item $ viewChatItem chat item False ts tz <> viewItemReactions item
|
|
CRChatItems u chatItems -> ttyUser u $ concatMap (\(AChatItem _ _ chat item) -> viewChatItem chat item True ts tz <> viewItemReactions item) chatItems
|
|
CRChatItemInfo u ci ciInfo -> ttyUser u $ viewChatItemInfo ci ciInfo tz
|
|
CRChatItemId u itemId -> ttyUser u [plain $ maybe "no item" show itemId]
|
|
CRChatItemStatusUpdated u ci -> ttyUser u $ viewChatItemStatusUpdated ci ts tz testView showReceipts
|
|
CRChatItemUpdated u (AChatItem _ _ chat item) -> ttyUser u $ unmuted chat item $ viewItemUpdate chat item liveItems ts tz
|
|
CRChatItemNotChanged u ci -> ttyUser u $ viewItemNotChanged ci
|
|
CRChatItemDeleted u (AChatItem _ _ chat deletedItem) toItem byUser timed -> ttyUser u $ unmuted chat deletedItem $ viewItemDelete chat deletedItem toItem byUser timed ts tz testView
|
|
CRChatItemReaction u added (ACIReaction _ _ chat reaction) -> ttyUser u $ unmutedReaction chat reaction $ viewItemReaction showReactions chat reaction added ts tz
|
|
CRChatItemDeletedNotFound u Contact {localDisplayName = c} _ -> ttyUser u [ttyFrom $ c <> "> [deleted - original message not found]"]
|
|
CRBroadcastSent u mc s f t -> ttyUser u $ viewSentBroadcast mc s f ts tz t
|
|
CRMsgIntegrityError u mErr -> ttyUser u $ viewMsgIntegrityError mErr
|
|
CRCmdAccepted _ -> []
|
|
CRCmdOk u_ -> ttyUser' u_ ["ok"]
|
|
CRChatHelp section -> case section of
|
|
HSMain -> chatHelpInfo
|
|
HSFiles -> filesHelpInfo
|
|
HSGroups -> groupsHelpInfo
|
|
HSContacts -> contactsHelpInfo
|
|
HSMyAddress -> myAddressHelpInfo
|
|
HSIncognito -> incognitoHelpInfo
|
|
HSMessages -> messagesHelpInfo
|
|
HSMarkdown -> markdownInfo
|
|
HSSettings -> settingsInfo
|
|
HSDatabase -> databaseHelpInfo
|
|
CRWelcome user -> chatWelcome user
|
|
CRContactsList u cs -> ttyUser u $ viewContactsList cs
|
|
CRUserContactLink u UserContactLink {connReqContact, autoAccept} -> ttyUser u $ connReqContact_ "Your chat address:" connReqContact <> autoAcceptStatus_ autoAccept
|
|
CRUserContactLinkUpdated u UserContactLink {autoAccept} -> ttyUser u $ autoAcceptStatus_ autoAccept
|
|
CRContactRequestRejected u UserContactRequest {localDisplayName = c} -> ttyUser u [ttyContact c <> ": contact request rejected"]
|
|
CRGroupCreated u g -> ttyUser u $ viewGroupCreated g
|
|
CRGroupMembers u g -> ttyUser u $ viewGroupMembers g
|
|
CRGroupsList u gs -> ttyUser u $ viewGroupsList gs
|
|
CRSentGroupInvitation u g c _ ->
|
|
ttyUser u $
|
|
if viaGroupLink . contactConn $ c
|
|
then [ttyContact' c <> " invited to group " <> ttyGroup' g <> " via your group link"]
|
|
else ["invitation to join the group " <> ttyGroup' g <> " sent to " <> ttyContact' c]
|
|
CRFileTransferStatus u ftStatus -> ttyUser u $ viewFileTransferStatus ftStatus
|
|
CRFileTransferStatusXFTP u ci -> ttyUser u $ viewFileTransferStatusXFTP ci
|
|
CRUserProfile u p -> ttyUser u $ viewUserProfile p
|
|
CRUserProfileNoChange u -> ttyUser u ["user profile did not change"]
|
|
CRUserPrivacy u u' -> ttyUserPrefix u $ viewUserPrivacy u u'
|
|
CRVersionInfo info _ _ -> viewVersionInfo logLevel info
|
|
CRInvitation u cReq _ -> ttyUser u $ viewConnReqInvitation cReq
|
|
CRConnectionIncognitoUpdated u c -> ttyUser u $ viewConnectionIncognitoUpdated c
|
|
CRSentConfirmation u -> ttyUser u ["confirmation sent!"]
|
|
CRSentInvitation u customUserProfile -> ttyUser u $ viewSentInvitation customUserProfile testView
|
|
CRContactDeleted u c -> ttyUser u [ttyContact' c <> ": contact is deleted"]
|
|
CRChatCleared u chatInfo -> ttyUser u $ viewChatCleared chatInfo
|
|
CRAcceptingContactRequest u c -> ttyUser u [ttyFullContact c <> ": accepting contact request..."]
|
|
CRContactAlreadyExists u c -> ttyUser u [ttyFullContact c <> ": contact already exists"]
|
|
CRContactRequestAlreadyAccepted u c -> ttyUser u [ttyFullContact c <> ": sent you a duplicate contact request, but you are already connected, no action needed"]
|
|
CRUserContactLinkCreated u cReq -> ttyUser u $ connReqContact_ "Your new chat address is created!" cReq
|
|
CRUserContactLinkDeleted u -> ttyUser u viewUserContactLinkDeleted
|
|
CRUserAcceptedGroupSent u _g _ -> ttyUser u [] -- [ttyGroup' g <> ": joining the group..."]
|
|
CRUserDeletedMember u g m -> ttyUser u [ttyGroup' g <> ": you removed " <> ttyMember m <> " from the group"]
|
|
CRLeftMemberUser u g -> ttyUser u $ [ttyGroup' g <> ": you left the group"] <> groupPreserved g
|
|
CRGroupDeletedUser u g -> ttyUser u [ttyGroup' g <> ": you deleted the group"]
|
|
CRRcvFileDescrReady _ _ -> []
|
|
CRRcvFileDescrNotReady _ _ -> []
|
|
CRRcvFileProgressXFTP {} -> []
|
|
CRRcvFileAccepted u ci -> ttyUser u $ savingFile' testView ci
|
|
CRRcvFileAcceptedSndCancelled u ft -> ttyUser u $ viewRcvFileSndCancelled ft
|
|
CRSndFileCancelled u _ ftm fts -> ttyUser u $ viewSndFileCancelled ftm fts
|
|
CRRcvFileCancelled u _ ft -> ttyUser u $ receivingFile_ "cancelled" ft
|
|
CRUserProfileUpdated u p p' summary -> ttyUser u $ viewUserProfileUpdated p p' summary
|
|
CRUserProfileImage u p -> ttyUser u $ viewUserProfileImage p
|
|
CRContactPrefsUpdated {user = u, fromContact, toContact} -> ttyUser u $ viewUserContactPrefsUpdated u fromContact toContact
|
|
CRContactAliasUpdated u c -> ttyUser u $ viewContactAliasUpdated c
|
|
CRConnectionAliasUpdated u c -> ttyUser u $ viewConnectionAliasUpdated c
|
|
CRContactUpdated {user = u, fromContact = c, toContact = c'} -> ttyUser u $ viewContactUpdated c c' <> viewContactPrefsUpdated u c c'
|
|
CRContactsMerged u intoCt mergedCt -> ttyUser u $ viewContactsMerged intoCt mergedCt
|
|
CRReceivedContactRequest u UserContactRequest {localDisplayName = c, profile} -> ttyUser u $ viewReceivedContactRequest c profile
|
|
CRRcvFileStart u ci -> ttyUser u $ receivingFile_' "started" ci
|
|
CRRcvFileComplete u ci -> ttyUser u $ receivingFile_' "completed" ci
|
|
CRRcvFileSndCancelled u _ ft -> ttyUser u $ viewRcvFileSndCancelled ft
|
|
CRRcvFileError u ci -> ttyUser u $ receivingFile_' "error" ci
|
|
CRSndFileStart u _ ft -> ttyUser u $ sendingFile_ "started" ft
|
|
CRSndFileComplete u _ ft -> ttyUser u $ sendingFile_ "completed" ft
|
|
CRSndFileStartXFTP {} -> []
|
|
CRSndFileProgressXFTP {} -> []
|
|
CRSndFileCompleteXFTP u ci _ -> ttyUser u $ uploadingFile "completed" ci
|
|
CRSndFileCancelledXFTP {} -> []
|
|
CRSndFileError u ci -> ttyUser u $ uploadingFile "error" ci
|
|
CRSndFileRcvCancelled u _ ft@SndFileTransfer {recipientDisplayName = c} ->
|
|
ttyUser u [ttyContact c <> " cancelled receiving " <> sndFile ft]
|
|
CRContactConnecting u _ -> ttyUser u []
|
|
CRContactConnected u ct userCustomProfile -> ttyUser u $ viewContactConnected ct userCustomProfile testView
|
|
CRContactAnotherClient u c -> ttyUser u [ttyContact' c <> ": contact is connected to another client"]
|
|
CRSubscriptionEnd u acEntity -> ttyUser u [sShow (connId (entityConnection acEntity :: Connection)) <> ": END"]
|
|
CRContactsDisconnected srv cs -> [plain $ "server disconnected " <> showSMPServer srv <> " (" <> contactList cs <> ")"]
|
|
CRContactsSubscribed srv cs -> [plain $ "server connected " <> showSMPServer srv <> " (" <> contactList cs <> ")"]
|
|
CRContactSubError u c e -> ttyUser u [ttyContact' c <> ": contact error " <> sShow e]
|
|
CRContactSubSummary u summary ->
|
|
ttyUser u $ [sShow (length subscribed) <> " contacts connected (use " <> highlight' "/cs" <> " for the list)" | not (null subscribed)] <> viewErrorsSummary errors " contact errors"
|
|
where
|
|
(errors, subscribed) = partition (isJust . contactError) summary
|
|
CRUserContactSubSummary u summary ->
|
|
ttyUser u $
|
|
map addressSS addresses
|
|
<> ([sShow (length groupLinksSubscribed) <> " group links active" | not (null groupLinksSubscribed)] <> viewErrorsSummary groupLinkErrors " group link errors")
|
|
where
|
|
(addresses, groupLinks) = partition (\UserContactSubStatus {userContact} -> isNothing . userContactGroupId $ userContact) summary
|
|
addressSS UserContactSubStatus {userContactError} = maybe ("Your address is active! To show: " <> highlight' "/sa") (\e -> "User address error: " <> sShow e <> ", to delete your address: " <> highlight' "/da") userContactError
|
|
(groupLinkErrors, groupLinksSubscribed) = partition (isJust . userContactError) groupLinks
|
|
CRGroupInvitation u g -> ttyUser u [groupInvitation' g]
|
|
CRReceivedGroupInvitation {user = u, groupInfo = g, contact = c, memberRole = r} -> ttyUser u $ viewReceivedGroupInvitation g c r
|
|
CRUserJoinedGroup u g _ -> ttyUser u $ viewUserJoinedGroup g
|
|
CRJoinedGroupMember u g m -> ttyUser u $ viewJoinedGroupMember g m
|
|
CRHostConnected p h -> [plain $ "connected to " <> viewHostEvent p h]
|
|
CRHostDisconnected p h -> [plain $ "disconnected from " <> viewHostEvent p h]
|
|
CRJoinedGroupMemberConnecting u g host m -> ttyUser u [ttyGroup' g <> ": " <> ttyMember host <> " added " <> ttyFullMember m <> " to the group (connecting...)"]
|
|
CRConnectedToGroupMember u g m _ -> ttyUser u [ttyGroup' g <> ": " <> connectedMember m <> " is connected"]
|
|
CRMemberRole u g by m r r' -> ttyUser u $ viewMemberRoleChanged g by m r r'
|
|
CRMemberRoleUser u g m r r' -> ttyUser u $ viewMemberRoleUserChanged g m r r'
|
|
CRDeletedMemberUser u g by -> ttyUser u $ [ttyGroup' g <> ": " <> ttyMember by <> " removed you from the group"] <> groupPreserved g
|
|
CRDeletedMember u g by m -> ttyUser u [ttyGroup' g <> ": " <> ttyMember by <> " removed " <> ttyMember m <> " from the group"]
|
|
CRLeftMember u g m -> ttyUser u [ttyGroup' g <> ": " <> ttyMember m <> " left the group"]
|
|
CRGroupEmpty u g -> ttyUser u [ttyFullGroup g <> ": group is empty"]
|
|
CRGroupRemoved u g -> ttyUser u [ttyFullGroup g <> ": you are no longer a member or group deleted"]
|
|
CRGroupDeleted u g m -> ttyUser u [ttyGroup' g <> ": " <> ttyMember m <> " deleted the group", "use " <> highlight ("/d #" <> groupName' g) <> " to delete the local copy of the group"]
|
|
CRGroupUpdated u g g' m -> ttyUser u $ viewGroupUpdated g g' m
|
|
CRGroupProfile u g -> ttyUser u $ viewGroupProfile g
|
|
CRGroupDescription u g -> ttyUser u $ viewGroupDescription g
|
|
CRGroupLinkCreated u g cReq mRole -> ttyUser u $ groupLink_ "Group link is created!" g cReq mRole
|
|
CRGroupLink u g cReq mRole -> ttyUser u $ groupLink_ "Group link:" g cReq mRole
|
|
CRGroupLinkDeleted u g -> ttyUser u $ viewGroupLinkDeleted g
|
|
CRAcceptingGroupJoinRequest _ g c -> [ttyFullContact c <> ": accepting request to join group " <> ttyGroup' g <> "..."]
|
|
CRMemberSubError u g m e -> ttyUser u [ttyGroup' g <> " member " <> ttyMember m <> " error: " <> sShow e]
|
|
CRMemberSubSummary u summary -> ttyUser u $ viewErrorsSummary (filter (isJust . memberError) summary) " group member errors"
|
|
CRGroupSubscribed u g -> ttyUser u $ viewGroupSubscribed g
|
|
CRPendingSubSummary u _ -> ttyUser u []
|
|
CRSndFileSubError u SndFileTransfer {fileId, fileName} e ->
|
|
ttyUser u ["sent file " <> sShow fileId <> " (" <> plain fileName <> ") error: " <> sShow e]
|
|
CRRcvFileSubError u RcvFileTransfer {fileId, fileInvitation = FileInvitation {fileName}} e ->
|
|
ttyUser u ["received file " <> sShow fileId <> " (" <> plain fileName <> ") error: " <> sShow e]
|
|
CRCallInvitation RcvCallInvitation {user, contact, callType, sharedKey} -> ttyUser user $ viewCallInvitation contact callType sharedKey
|
|
CRCallOffer {user = u, contact, callType, offer, sharedKey} -> ttyUser u $ viewCallOffer contact callType offer sharedKey
|
|
CRCallAnswer {user = u, contact, answer} -> ttyUser u $ viewCallAnswer contact answer
|
|
CRCallExtraInfo {user = u, contact} -> ttyUser u ["call extra info from " <> ttyContact' contact]
|
|
CRCallEnded {user = u, contact} -> ttyUser u ["call with " <> ttyContact' contact <> " ended"]
|
|
CRCallInvitations _ -> []
|
|
CRUserContactLinkSubscribed -> ["Your address is active! To show: " <> highlight' "/sa"]
|
|
CRUserContactLinkSubError e -> ["user address error: " <> sShow e, "to delete your address: " <> highlight' "/da"]
|
|
CRNewContactConnection u _ -> ttyUser u []
|
|
CRContactConnectionDeleted u PendingContactConnection {pccConnId} -> ttyUser u ["connection :" <> sShow pccConnId <> " deleted"]
|
|
CRNtfTokenStatus status -> ["device token status: " <> plain (smpEncode status)]
|
|
CRNtfToken _ status mode -> ["device token status: " <> plain (smpEncode status) <> ", notifications mode: " <> plain (strEncode mode)]
|
|
CRNtfMessages {} -> []
|
|
CRSQLResult rows -> map plain rows
|
|
CRSlowSQLQueries {chatQueries, agentQueries} ->
|
|
let viewQuery SlowSQLQuery {query, queryStats = SlowQueryStats {count, timeMax, timeAvg}} =
|
|
("count: " <> sShow count)
|
|
<> (" :: max: " <> sShow timeMax <> " ms")
|
|
<> (" :: avg: " <> sShow timeAvg <> " ms")
|
|
<> (" :: " <> plain (T.unwords $ T.lines query))
|
|
in ("Chat queries" : map viewQuery chatQueries) <> [""] <> ("Agent queries" : map viewQuery agentQueries)
|
|
CRDebugLocks {chatLockName, agentLocks} ->
|
|
[ maybe "no chat lock" (("chat lock: " <>) . plain) chatLockName,
|
|
plain $ "agent locks: " <> LB.unpack (J.encode agentLocks)
|
|
]
|
|
CRAgentStats stats -> map (plain . intercalate ",") stats
|
|
CRAgentSubs {activeSubs, distinctActiveSubs, pendingSubs, distinctPendingSubs} ->
|
|
[plain $ "Subscriptions: active = " <> show (sum activeSubs) <> ", distinct active = " <> show (sum distinctActiveSubs) <> ", pending = " <> show (sum pendingSubs) <> ", distinct pending = " <> show (sum distinctPendingSubs)]
|
|
<> ("active subscriptions:" : listSubs activeSubs)
|
|
<> ("distinct active subscriptions:" : listSubs distinctActiveSubs)
|
|
<> ("pending subscriptions:" : listSubs pendingSubs)
|
|
<> ("distinct pending subscriptions:" : listSubs distinctPendingSubs)
|
|
where
|
|
listSubs = map (\(srv, count) -> plain $ srv <> ": " <> tshow count) . M.assocs
|
|
CRAgentSubsDetails SubscriptionsInfo {activeSubscriptions, pendingSubscriptions} ->
|
|
("active subscriptions:" : map sShow activeSubscriptions)
|
|
<> ("pending subscriptions: " : map sShow pendingSubscriptions)
|
|
CRConnectionDisabled entity -> viewConnectionEntityDisabled entity
|
|
CRAgentRcvQueueDeleted acId srv aqId err_ ->
|
|
[ ("completed deleting rcv queue, agent connection id: " <> sShow acId)
|
|
<> (", server: " <> sShow srv)
|
|
<> (", agent queue id: " <> sShow aqId)
|
|
<> maybe "" (\e -> ", error: " <> sShow e) err_
|
|
| logLevel <= CLLInfo
|
|
]
|
|
CRAgentConnDeleted acId -> ["completed deleting connection, agent connection id: " <> sShow acId | logLevel <= CLLInfo]
|
|
CRAgentUserDeleted auId -> ["completed deleting user" <> if logLevel <= CLLInfo then ", agent user id: " <> sShow auId else ""]
|
|
CRMessageError u prefix err -> ttyUser u [plain prefix <> ": " <> plain err | prefix == "error" || logLevel <= CLLWarning]
|
|
CRChatCmdError u e -> ttyUserPrefix' u $ viewChatError logLevel e
|
|
CRChatError u e -> ttyUser' u $ viewChatError logLevel e
|
|
CRArchiveImported archiveErrs -> if null archiveErrs then ["ok"] else ["archive import errors: " <> plain (show archiveErrs)]
|
|
CRTimedAction _ _ -> []
|
|
where
|
|
ttyUser :: User -> [StyledString] -> [StyledString]
|
|
ttyUser user@User {showNtfs, activeUser} ss
|
|
| showNtfs || activeUser = ttyUserPrefix user ss
|
|
| otherwise = []
|
|
ttyUserPrefix :: User -> [StyledString] -> [StyledString]
|
|
ttyUserPrefix _ [] = []
|
|
ttyUserPrefix User {userId, localDisplayName = u} ss = prependFirst userPrefix ss
|
|
where
|
|
userPrefix = case user_ of
|
|
Just User {userId = activeUserId} -> if userId /= activeUserId then prefix else ""
|
|
_ -> prefix
|
|
prefix = "[user: " <> highlight u <> "] "
|
|
ttyUser' :: Maybe User -> [StyledString] -> [StyledString]
|
|
ttyUser' = maybe id ttyUser
|
|
ttyUserPrefix' :: Maybe User -> [StyledString] -> [StyledString]
|
|
ttyUserPrefix' = maybe id ttyUserPrefix
|
|
testViewChats :: [AChat] -> [StyledString]
|
|
testViewChats chats = [sShow $ map toChatView chats]
|
|
where
|
|
toChatView :: AChat -> (Text, Text, Maybe ConnStatus)
|
|
toChatView (AChat _ (Chat (DirectChat Contact {localDisplayName, activeConn}) items _)) = ("@" <> localDisplayName, toCIPreview items Nothing, Just $ connStatus activeConn)
|
|
toChatView (AChat _ (Chat (GroupChat GroupInfo {membership, localDisplayName}) items _)) = ("#" <> localDisplayName, toCIPreview items (Just membership), Nothing)
|
|
toChatView (AChat _ (Chat (ContactRequest UserContactRequest {localDisplayName}) items _)) = ("<@" <> localDisplayName, toCIPreview items Nothing, Nothing)
|
|
toChatView (AChat _ (Chat (ContactConnection PendingContactConnection {pccConnId, pccConnStatus}) items _)) = (":" <> T.pack (show pccConnId), toCIPreview items Nothing, Just pccConnStatus)
|
|
toCIPreview :: [CChatItem c] -> Maybe GroupMember -> Text
|
|
toCIPreview (ci : _) membership_ = testViewItem ci membership_
|
|
toCIPreview _ _ = ""
|
|
testViewChat :: AChat -> [StyledString]
|
|
testViewChat (AChat _ Chat {chatInfo, chatItems}) = [sShow $ map toChatView chatItems]
|
|
where
|
|
toChatView :: CChatItem c -> ((Int, Text), Maybe (Int, Text), Maybe String)
|
|
toChatView ci@(CChatItem dir ChatItem {quotedItem, file}) =
|
|
((msgDirectionInt $ toMsgDirection dir, testViewItem ci (chatInfoMembership chatInfo)), qItem, fPath)
|
|
where
|
|
qItem = case quotedItem of
|
|
Nothing -> Nothing
|
|
Just CIQuote {chatDir = quoteDir, content} ->
|
|
Just (msgDirectionInt $ quoteMsgDirection quoteDir, msgContentText content)
|
|
fPath = case file of
|
|
Just CIFile {fileSource = Just (CryptoFile fp _)} -> Just fp
|
|
_ -> Nothing
|
|
testViewItem :: CChatItem c -> Maybe GroupMember -> Text
|
|
testViewItem (CChatItem _ ci@ChatItem {meta = CIMeta {itemText}}) membership_ =
|
|
let deleted_ = maybe "" (\t -> " [" <> t <> "]") (chatItemDeletedText ci membership_)
|
|
in itemText <> deleted_
|
|
viewErrorsSummary :: [a] -> StyledString -> [StyledString]
|
|
viewErrorsSummary summary s = [ttyError (T.pack . show $ length summary) <> s <> " (run with -c option to show each error)" | not (null summary)]
|
|
contactList :: [ContactRef] -> String
|
|
contactList cs = T.unpack . T.intercalate ", " $ map (\ContactRef {localDisplayName = n} -> "@" <> n) cs
|
|
unmuted :: ChatInfo c -> ChatItem c d -> [StyledString] -> [StyledString]
|
|
unmuted chat ChatItem {chatDir} = unmuted' chat chatDir
|
|
unmutedReaction :: ChatInfo c -> CIReaction c d -> [StyledString] -> [StyledString]
|
|
unmutedReaction chat CIReaction {chatDir} = unmuted' chat chatDir
|
|
unmuted' :: ChatInfo c -> CIDirection c d -> [StyledString] -> [StyledString]
|
|
unmuted' chat chatDir s
|
|
| muted chat chatDir = []
|
|
| otherwise = s
|
|
|
|
chatItemDeletedText :: ChatItem c d -> Maybe GroupMember -> Maybe Text
|
|
chatItemDeletedText ci membership_ = deletedStateToText <$> chatItemDeletedState ci
|
|
where
|
|
deletedStateToText = \CIDeletedState {markedDeleted, deletedByMember} ->
|
|
if markedDeleted
|
|
then "marked deleted" <> byMember deletedByMember
|
|
else "deleted" <> byMember deletedByMember
|
|
byMember m_ = case (m_, membership_) of
|
|
(Just GroupMember {groupMemberId = mId, localDisplayName = n}, Just GroupMember {groupMemberId = membershipId}) ->
|
|
" by " <> if mId == membershipId then "you" else n
|
|
_ -> ""
|
|
|
|
viewUsersList :: [UserInfo] -> [StyledString]
|
|
viewUsersList = mapMaybe userInfo . sortOn ldn
|
|
where
|
|
ldn (UserInfo User {localDisplayName = n} _) = T.toLower n
|
|
userInfo (UserInfo User {localDisplayName = n, profile = LocalProfile {fullName}, activeUser, showNtfs, viewPwdHash} count)
|
|
| activeUser || isNothing viewPwdHash = Just $ ttyFullName n fullName <> infoStr
|
|
| otherwise = Nothing
|
|
where
|
|
infoStr = if null info then "" else " (" <> mconcat (intersperse ", " info) <> ")"
|
|
info =
|
|
[highlight' "active" | activeUser]
|
|
<> [highlight' "hidden" | isJust viewPwdHash]
|
|
<> ["muted" | not showNtfs]
|
|
<> [plain ("unread: " <> show count) | count /= 0]
|
|
|
|
muted :: ChatInfo c -> CIDirection c d -> Bool
|
|
muted chat chatDir = case (chat, chatDir) of
|
|
(DirectChat Contact {chatSettings = DisableNtfs}, CIDirectRcv) -> True
|
|
(GroupChat GroupInfo {chatSettings = DisableNtfs}, CIGroupRcv _) -> True
|
|
_ -> False
|
|
|
|
viewGroupSubscribed :: GroupInfo -> [StyledString]
|
|
viewGroupSubscribed g = [membershipIncognito g <> ttyFullGroup g <> ": connected to server(s)"]
|
|
|
|
showSMPServer :: SMPServer -> String
|
|
showSMPServer = B.unpack . strEncode . host
|
|
|
|
viewHostEvent :: AProtocolType -> TransportHost -> String
|
|
viewHostEvent p h = map toUpper (B.unpack $ strEncode p) <> " host " <> B.unpack (strEncode h)
|
|
|
|
viewChats :: CurrentTime -> TimeZone -> [AChat] -> [StyledString]
|
|
viewChats ts tz = concatMap chatPreview . reverse
|
|
where
|
|
chatPreview (AChat _ (Chat chat items _)) = case items of
|
|
CChatItem _ ci : _ -> case viewChatItem chat ci True ts tz of
|
|
s : _ -> [let s' = sTake 120 s in if sLength s' < sLength s then s' <> "..." else s']
|
|
_ -> chatName
|
|
_ -> chatName
|
|
where
|
|
chatName = case chat of
|
|
DirectChat ct -> [" " <> ttyToContact' ct]
|
|
GroupChat g -> [" " <> ttyToGroup g]
|
|
_ -> []
|
|
|
|
viewChatItem :: forall c d. MsgDirectionI d => ChatInfo c -> ChatItem c d -> Bool -> CurrentTime -> TimeZone -> [StyledString]
|
|
viewChatItem chat ci@ChatItem {chatDir, meta = meta, content, quotedItem, file} doShow ts tz =
|
|
withItemDeleted <$> case chat of
|
|
DirectChat c -> case chatDir of
|
|
CIDirectSnd -> case content of
|
|
CISndMsgContent mc -> hideLive meta $ withSndFile to $ sndMsg to quote mc
|
|
CISndGroupEvent {} -> showSndItemProhibited to
|
|
_ -> showSndItem to
|
|
where
|
|
to = ttyToContact' c
|
|
CIDirectRcv -> case content of
|
|
CIRcvMsgContent mc -> withRcvFile from $ rcvMsg from quote mc
|
|
CIRcvIntegrityError err -> viewRcvIntegrityError from err ts tz meta
|
|
CIRcvGroupEvent {} -> showRcvItemProhibited from
|
|
_ -> showRcvItem from
|
|
where
|
|
from = ttyFromContact c
|
|
where
|
|
quote = maybe [] (directQuote chatDir) quotedItem
|
|
GroupChat g -> case chatDir of
|
|
CIGroupSnd -> case content of
|
|
CISndMsgContent mc -> hideLive meta $ withSndFile to $ sndMsg to quote mc
|
|
CISndGroupInvitation {} -> showSndItemProhibited to
|
|
_ -> showSndItem to
|
|
where
|
|
to = ttyToGroup g
|
|
CIGroupRcv m -> case content of
|
|
CIRcvMsgContent mc -> withRcvFile from $ rcvMsg from quote mc
|
|
CIRcvIntegrityError err -> viewRcvIntegrityError from err ts tz meta
|
|
CIRcvGroupInvitation {} -> showRcvItemProhibited from
|
|
CIRcvModerated {} -> receivedWithTime_ ts tz (ttyFromGroup g m) quote meta [plainContent content] False
|
|
_ -> showRcvItem from
|
|
where
|
|
from = ttyFromGroup g m
|
|
where
|
|
quote = maybe [] (groupQuote g) quotedItem
|
|
_ -> []
|
|
where
|
|
withItemDeleted item = case chatItemDeletedText ci (chatInfoMembership chat) of
|
|
Nothing -> item
|
|
Just t -> item <> styled (colored Red) (" [" <> t <> "]")
|
|
withSndFile = withFile viewSentFileInvitation
|
|
withRcvFile = withFile viewReceivedFileInvitation
|
|
withFile view dir l = maybe l (\f -> l <> view dir f ts tz meta) file
|
|
sndMsg = msg viewSentMessage
|
|
rcvMsg = msg viewReceivedMessage
|
|
msg view dir quote mc = case (msgContentText mc, file, quote) of
|
|
("", Just _, []) -> []
|
|
("", Just CIFile {fileName}, _) -> view dir quote (MCText $ T.pack fileName) ts tz meta
|
|
_ -> view dir quote mc ts tz meta
|
|
showSndItem to = showItem $ sentWithTime_ ts tz [to <> plainContent content] meta
|
|
showRcvItem from = showItem $ receivedWithTime_ ts tz from [] meta [plainContent content] False
|
|
showSndItemProhibited to = showItem $ sentWithTime_ ts tz [to <> plainContent content <> " " <> prohibited] meta
|
|
showRcvItemProhibited from = showItem $ receivedWithTime_ ts tz from [] meta [plainContent content <> " " <> prohibited] False
|
|
showItem ss = if doShow then ss else []
|
|
plainContent = plain . ciContentToText
|
|
prohibited = styled (colored Red) ("[unexpected chat item created, please report to developers]" :: String)
|
|
|
|
viewChatItemInfo :: AChatItem -> ChatItemInfo -> TimeZone -> [StyledString]
|
|
viewChatItemInfo (AChatItem _ msgDir _ ChatItem {meta = CIMeta {itemTs, itemTimed, createdAt}}) ChatItemInfo {itemVersions} tz =
|
|
["sent at: " <> ts itemTs]
|
|
<> receivedAt
|
|
<> toBeDeletedAt
|
|
<> versions
|
|
where
|
|
ts = styleTime . localTs tz
|
|
receivedAt = case msgDir of
|
|
SMDRcv -> ["received at: " <> ts createdAt]
|
|
SMDSnd -> []
|
|
toBeDeletedAt = case itemTimed >>= timedDeleteAt' of
|
|
Just d -> ["to be deleted at: " <> ts d]
|
|
Nothing -> []
|
|
versions =
|
|
if null itemVersions
|
|
then []
|
|
else ["message history:"] <> concatMap version itemVersions
|
|
version ChatItemVersion {msgContent, itemVersionTs} = prependFirst (ts itemVersionTs <> styleTime ": ") $ ttyMsgContent msgContent
|
|
|
|
localTs :: TimeZone -> UTCTime -> String
|
|
localTs tz ts = do
|
|
let localTime = utcToLocalTime tz ts
|
|
formattedTime = formatTime defaultTimeLocale "%Y-%m-%d %H:%M:%S" localTime
|
|
formattedTime
|
|
|
|
viewChatItemStatusUpdated :: AChatItem -> CurrentTime -> TimeZone -> Bool -> Bool -> [StyledString]
|
|
viewChatItemStatusUpdated (AChatItem _ _ chat item@ChatItem {meta = CIMeta {itemStatus}}) ts tz testView showReceipts =
|
|
case itemStatus of
|
|
CISSndRcvd rcptStatus SSPPartial ->
|
|
if testView && showReceipts
|
|
then prependFirst (viewDeliveryReceiptPartial rcptStatus <> " ") $ viewChatItem chat item False ts tz
|
|
else []
|
|
CISSndRcvd rcptStatus SSPComplete ->
|
|
if testView && showReceipts
|
|
then prependFirst (viewDeliveryReceipt rcptStatus <> " ") $ viewChatItem chat item False ts tz
|
|
else []
|
|
_ -> []
|
|
|
|
viewDeliveryReceiptPartial :: MsgReceiptStatus -> StyledString
|
|
viewDeliveryReceiptPartial = \case
|
|
MROk -> "%"
|
|
MRBadMsgHash -> ttyError' "%!"
|
|
|
|
viewDeliveryReceipt :: MsgReceiptStatus -> StyledString
|
|
viewDeliveryReceipt = \case
|
|
MROk -> "⩗"
|
|
MRBadMsgHash -> ttyError' "⩗!"
|
|
|
|
viewItemUpdate :: MsgDirectionI d => ChatInfo c -> ChatItem c d -> Bool -> CurrentTime -> TimeZone -> [StyledString]
|
|
viewItemUpdate chat ChatItem {chatDir, meta = meta@CIMeta {itemEdited, itemLive}, content, quotedItem} liveItems ts tz = case chat of
|
|
DirectChat c -> case chatDir of
|
|
CIDirectRcv -> case content of
|
|
CIRcvMsgContent mc
|
|
| itemLive == Just True && not liveItems -> []
|
|
| otherwise -> viewReceivedUpdatedMessage from quote mc ts tz meta
|
|
_ -> []
|
|
where
|
|
from = if itemEdited then ttyFromContactEdited c else ttyFromContact c
|
|
CIDirectSnd -> case content of
|
|
CISndMsgContent mc -> hideLive meta $ viewSentMessage to quote mc ts tz meta
|
|
_ -> []
|
|
where
|
|
to = if itemEdited then ttyToContactEdited' c else ttyToContact' c
|
|
where
|
|
quote = maybe [] (directQuote chatDir) quotedItem
|
|
GroupChat g -> case chatDir of
|
|
CIGroupRcv m -> case content of
|
|
CIRcvMsgContent mc
|
|
| itemLive == Just True && not liveItems -> []
|
|
| otherwise -> viewReceivedUpdatedMessage from quote mc ts tz meta
|
|
_ -> []
|
|
where
|
|
from = if itemEdited then ttyFromGroupEdited g m else ttyFromGroup g m
|
|
CIGroupSnd -> case content of
|
|
CISndMsgContent mc -> hideLive meta $ viewSentMessage to quote mc ts tz meta
|
|
_ -> []
|
|
where
|
|
to = if itemEdited then ttyToGroupEdited g else ttyToGroup g
|
|
where
|
|
quote = maybe [] (groupQuote g) quotedItem
|
|
_ -> []
|
|
|
|
hideLive :: CIMeta c d -> [StyledString] -> [StyledString]
|
|
hideLive CIMeta {itemLive = Just True} _ = []
|
|
hideLive _ s = s
|
|
|
|
viewItemNotChanged :: AChatItem -> [StyledString]
|
|
viewItemNotChanged (AChatItem _ msgDir _ _) = case msgDir of
|
|
SMDSnd -> ["message didn't change"]
|
|
SMDRcv -> []
|
|
|
|
viewItemDelete :: ChatInfo c -> ChatItem c d -> Maybe AChatItem -> Bool -> Bool -> CurrentTime -> TimeZone -> Bool -> [StyledString]
|
|
viewItemDelete chat ci@ChatItem {chatDir, meta, content = deletedContent} toItem byUser timed ts tz testView
|
|
| timed = [plain ("timed message deleted: " <> T.unpack (ciContentToText deletedContent)) | testView]
|
|
| byUser = [plain $ "message " <> T.unpack (fromMaybe "deleted" deletedText_)] -- deletedText_ Nothing should be impossible here
|
|
| otherwise = case chat of
|
|
DirectChat c -> case (chatDir, deletedContent) of
|
|
(CIDirectRcv, CIRcvMsgContent mc) -> viewReceivedMessage (ttyFromContactDeleted c deletedText_) [] mc ts tz meta
|
|
_ -> prohibited
|
|
GroupChat g -> case ciMsgContent deletedContent of
|
|
Just mc ->
|
|
let m = chatItemMember g ci
|
|
in viewReceivedMessage (ttyFromGroupDeleted g m deletedText_) [] mc ts tz meta
|
|
_ -> prohibited
|
|
_ -> prohibited
|
|
where
|
|
deletedText_ :: Maybe Text
|
|
deletedText_ = case toItem of
|
|
Nothing -> Just "deleted"
|
|
Just (AChatItem _ _ _ ci') -> chatItemDeletedText ci' $ chatInfoMembership chat
|
|
prohibited = [styled (colored Red) ("[unexpected message deletion, please report to developers]" :: String)]
|
|
|
|
viewItemReaction :: forall c d. Bool -> ChatInfo c -> CIReaction c d -> Bool -> CurrentTime -> TimeZone -> [StyledString]
|
|
viewItemReaction showReactions chat CIReaction {chatDir, chatItem = CChatItem md ChatItem {chatDir = itemDir, content}, sentAt, reaction} added ts tz =
|
|
case (chat, chatDir) of
|
|
(DirectChat c, CIDirectRcv) -> case ciMsgContent content of
|
|
Just mc -> view from $ reactionMsg mc
|
|
_ -> []
|
|
where
|
|
from = ttyFromContact c
|
|
reactionMsg mc = quoteText mc $ if toMsgDirection md == MDSnd then ">>" else ">"
|
|
(GroupChat g, CIGroupRcv m) -> case ciMsgContent content of
|
|
Just mc -> view from $ reactionMsg mc
|
|
_ -> []
|
|
where
|
|
from = ttyFromGroup g m
|
|
reactionMsg mc = quoteText mc . ttyQuotedMember . Just $ sentByMember' g itemDir
|
|
(_, CIDirectSnd) -> [sentText]
|
|
(_, CIGroupSnd) -> [sentText]
|
|
where
|
|
view from msg
|
|
| showReactions = viewReceivedReaction from msg reactionText ts tz sentAt
|
|
| otherwise = []
|
|
reactionText = plain $ (if added then "+ " else "- ") <> [emoji]
|
|
emoji = case reaction of
|
|
MREmoji (MREmojiChar c) -> c
|
|
_ -> '?'
|
|
sentText = plain $ (if added then "added " else "removed ") <> [emoji]
|
|
|
|
viewItemReactions :: ChatItem c d -> [StyledString]
|
|
viewItemReactions ChatItem {reactions} = [" " <> viewReactions reactions | not (null reactions)]
|
|
where
|
|
viewReactions = mconcat . intersperse " " . map viewReaction
|
|
viewReaction CIReactionCount {reaction = MRUnknown {}} = "?"
|
|
viewReaction CIReactionCount {reaction = MREmoji (MREmojiChar emoji), userReacted, totalReacted} =
|
|
plain [emoji, ' '] <> (if userReacted then styled Italic else plain) (show totalReacted)
|
|
|
|
directQuote :: forall d'. MsgDirectionI d' => CIDirection 'CTDirect d' -> CIQuote 'CTDirect -> [StyledString]
|
|
directQuote _ CIQuote {content = qmc, chatDir = quoteDir} =
|
|
quoteText qmc $ if toMsgDirection (msgDirection @d') == quoteMsgDirection quoteDir then ">>" else ">"
|
|
|
|
groupQuote :: GroupInfo -> CIQuote 'CTGroup -> [StyledString]
|
|
groupQuote g CIQuote {content = qmc, chatDir = quoteDir} = quoteText qmc . ttyQuotedMember $ sentByMember g quoteDir
|
|
|
|
sentByMember :: GroupInfo -> CIQDirection 'CTGroup -> Maybe GroupMember
|
|
sentByMember GroupInfo {membership} = \case
|
|
CIQGroupSnd -> Just membership
|
|
CIQGroupRcv m -> m
|
|
|
|
sentByMember' :: GroupInfo -> CIDirection 'CTGroup d -> GroupMember
|
|
sentByMember' GroupInfo {membership} = \case
|
|
CIGroupSnd -> membership
|
|
CIGroupRcv m -> m
|
|
|
|
quoteText :: MsgContent -> StyledString -> [StyledString]
|
|
quoteText qmc sentBy = prependFirst (sentBy <> " ") $ msgPreview qmc
|
|
|
|
msgPreview :: MsgContent -> [StyledString]
|
|
msgPreview = msgPlain . preview . msgContentText
|
|
where
|
|
preview t
|
|
| T.length t <= 120 = t
|
|
| otherwise = T.take 120 t <> "..."
|
|
|
|
viewRcvIntegrityError :: StyledString -> MsgErrorType -> CurrentTime -> TimeZone -> CIMeta c 'MDRcv -> [StyledString]
|
|
viewRcvIntegrityError from msgErr ts tz meta = receivedWithTime_ ts tz from [] meta (viewMsgIntegrityError msgErr) False
|
|
|
|
viewMsgIntegrityError :: MsgErrorType -> [StyledString]
|
|
viewMsgIntegrityError err = [ttyError $ msgIntegrityError err]
|
|
|
|
viewInvalidConnReq :: [StyledString]
|
|
viewInvalidConnReq =
|
|
[ "",
|
|
"Connection link is invalid, possibly it was created in a previous version.",
|
|
"Please ask your contact to check " <> highlight' "/version" <> " and update if needed.",
|
|
plain updateStr
|
|
]
|
|
|
|
viewConnReqInvitation :: ConnReqInvitation -> [StyledString]
|
|
viewConnReqInvitation cReq =
|
|
[ "pass this invitation link to your contact (via another channel): ",
|
|
"",
|
|
(plain . strEncode) cReq,
|
|
"",
|
|
"and ask them to connect: " <> highlight' "/c <invitation_link_above>"
|
|
]
|
|
|
|
viewChatCleared :: AChatInfo -> [StyledString]
|
|
viewChatCleared (AChatInfo _ chatInfo) = case chatInfo of
|
|
DirectChat ct -> [ttyContact' ct <> ": all messages are removed locally ONLY"]
|
|
GroupChat gi -> [ttyGroup' gi <> ": all messages are removed locally ONLY"]
|
|
_ -> []
|
|
|
|
viewContactsList :: [Contact] -> [StyledString]
|
|
viewContactsList =
|
|
let ldn = T.toLower . (localDisplayName :: Contact -> ContactName)
|
|
in map (\ct -> ctIncognito ct <> ttyFullContact ct <> muted' ct <> alias ct) . sortOn ldn
|
|
where
|
|
muted' Contact {chatSettings, localDisplayName = ldn}
|
|
| enableNtfs chatSettings = ""
|
|
| otherwise = " (muted, you can " <> highlight ("/unmute @" <> ldn) <> ")"
|
|
alias Contact {profile = LocalProfile {localAlias}}
|
|
| localAlias == "" = ""
|
|
| otherwise = " (alias: " <> plain localAlias <> ")"
|
|
|
|
viewUserContactLinkDeleted :: [StyledString]
|
|
viewUserContactLinkDeleted =
|
|
[ "Your chat address is deleted - accepted contacts will remain connected.",
|
|
"To create a new chat address use " <> highlight' "/ad"
|
|
]
|
|
|
|
connReqContact_ :: StyledString -> ConnReqContact -> [StyledString]
|
|
connReqContact_ intro cReq =
|
|
[ intro,
|
|
"",
|
|
(plain . strEncode) cReq,
|
|
"",
|
|
"Anybody can send you contact requests with: " <> highlight' "/c <contact_link_above>",
|
|
"to show it again: " <> highlight' "/sa",
|
|
"to share with your contacts: " <> highlight' "/profile_address on",
|
|
"to delete it: " <> highlight' "/da" <> " (accepted contacts will remain connected)"
|
|
]
|
|
|
|
autoAcceptStatus_ :: Maybe AutoAccept -> [StyledString]
|
|
autoAcceptStatus_ = \case
|
|
Just AutoAccept {acceptIncognito, autoReply} ->
|
|
("auto_accept on" <> if acceptIncognito then ", incognito" else "") :
|
|
maybe [] ((["auto reply:"] <>) . ttyMsgContent) autoReply
|
|
_ -> ["auto_accept off"]
|
|
|
|
groupLink_ :: StyledString -> GroupInfo -> ConnReqContact -> GroupMemberRole -> [StyledString]
|
|
groupLink_ intro g cReq mRole =
|
|
[ intro,
|
|
"",
|
|
(plain . strEncode) cReq,
|
|
"",
|
|
"Anybody can connect to you and join group as " <> showRole mRole <> " with: " <> highlight' "/c <group_link_above>",
|
|
"to show it again: " <> highlight ("/show link #" <> groupName' g),
|
|
"to delete it: " <> highlight ("/delete link #" <> groupName' g) <> " (joined members will remain connected to you)"
|
|
]
|
|
|
|
viewGroupLinkDeleted :: GroupInfo -> [StyledString]
|
|
viewGroupLinkDeleted g =
|
|
[ "Group link is deleted - joined members will remain connected.",
|
|
"To create a new group link use " <> highlight ("/create link #" <> groupName' g)
|
|
]
|
|
|
|
viewSentInvitation :: Maybe Profile -> Bool -> [StyledString]
|
|
viewSentInvitation incognitoProfile testView =
|
|
case incognitoProfile of
|
|
Just profile ->
|
|
if testView
|
|
then incognitoProfile' profile : message
|
|
else message
|
|
where
|
|
message = ["connection request sent incognito!"]
|
|
Nothing -> ["connection request sent!"]
|
|
|
|
viewReceivedContactRequest :: ContactName -> Profile -> [StyledString]
|
|
viewReceivedContactRequest c Profile {fullName} =
|
|
[ ttyFullName c fullName <> " wants to connect to you!",
|
|
"to accept: " <> highlight ("/ac " <> c),
|
|
"to reject: " <> highlight ("/rc " <> c) <> " (the sender will NOT be notified)"
|
|
]
|
|
|
|
viewGroupCreated :: GroupInfo -> [StyledString]
|
|
viewGroupCreated g@GroupInfo {localDisplayName = n} =
|
|
[ "group " <> ttyFullGroup g <> " is created",
|
|
"to add members use " <> highlight ("/a " <> n <> " <name>") <> " or " <> highlight ("/create link #" <> n)
|
|
]
|
|
|
|
viewCannotResendInvitation :: GroupInfo -> ContactName -> [StyledString]
|
|
viewCannotResendInvitation GroupInfo {localDisplayName = gn} c =
|
|
[ ttyContact c <> " is already invited to group " <> ttyGroup gn,
|
|
"to re-send invitation: " <> highlight ("/rm " <> gn <> " " <> c) <> ", " <> highlight ("/a " <> gn <> " " <> c)
|
|
]
|
|
|
|
viewDirectMessagesProhibited :: MsgDirection -> Contact -> [StyledString]
|
|
viewDirectMessagesProhibited MDSnd c = ["direct messages to indirect contact " <> ttyContact' c <> " are prohibited"]
|
|
viewDirectMessagesProhibited MDRcv c = ["received prohibited direct message from indirect contact " <> ttyContact' c <> " (discarded)"]
|
|
|
|
viewUserJoinedGroup :: GroupInfo -> [StyledString]
|
|
viewUserJoinedGroup g@GroupInfo {membership = membership@GroupMember {memberProfile}} =
|
|
if memberIncognito membership
|
|
then [ttyGroup' g <> ": you joined the group incognito as " <> incognitoProfile' (fromLocalProfile memberProfile)]
|
|
else [ttyGroup' g <> ": you joined the group"]
|
|
|
|
viewJoinedGroupMember :: GroupInfo -> GroupMember -> [StyledString]
|
|
viewJoinedGroupMember g m =
|
|
[ttyGroup' g <> ": " <> ttyMember m <> " joined the group "]
|
|
|
|
viewReceivedGroupInvitation :: GroupInfo -> Contact -> GroupMemberRole -> [StyledString]
|
|
viewReceivedGroupInvitation g@GroupInfo {membership = membership@GroupMember {memberProfile}} c role =
|
|
ttyFullGroup g <> ": " <> ttyContact' c <> " invites you to join the group as " <> plain (strEncode role) :
|
|
if memberIncognito membership
|
|
then ["use " <> highlight ("/j " <> groupName' g) <> " to join incognito as " <> incognitoProfile' (fromLocalProfile memberProfile)]
|
|
else ["use " <> highlight ("/j " <> groupName' g) <> " to accept"]
|
|
|
|
groupPreserved :: GroupInfo -> [StyledString]
|
|
groupPreserved g = ["use " <> highlight ("/d #" <> groupName' g) <> " to delete the group"]
|
|
|
|
connectedMember :: GroupMember -> StyledString
|
|
connectedMember m = case memberCategory m of
|
|
GCPreMember -> "member " <> ttyFullMember m
|
|
GCPostMember -> "new member " <> ttyMember m -- without fullName as as it was shown in joinedGroupMemberConnecting
|
|
_ -> "member " <> ttyMember m -- these case is not used
|
|
|
|
viewMemberRoleChanged :: GroupInfo -> GroupMember -> GroupMember -> GroupMemberRole -> GroupMemberRole -> [StyledString]
|
|
viewMemberRoleChanged g@GroupInfo {membership} by m r r'
|
|
| r == r' = [ttyGroup' g <> ": member role did not change"]
|
|
| groupMemberId' membership == memId = view "your role"
|
|
| groupMemberId' by == memId = view "the role"
|
|
| otherwise = view $ "the role of " <> ttyMember m
|
|
where
|
|
memId = groupMemberId' m
|
|
view s = [ttyGroup' g <> ": " <> ttyMember by <> " changed " <> s <> " from " <> showRole r <> " to " <> showRole r']
|
|
|
|
viewMemberRoleUserChanged :: GroupInfo -> GroupMember -> GroupMemberRole -> GroupMemberRole -> [StyledString]
|
|
viewMemberRoleUserChanged g@GroupInfo {membership} m r r'
|
|
| r == r' = [ttyGroup' g <> ": member role did not change"]
|
|
| groupMemberId' membership == groupMemberId' m = view "your role"
|
|
| otherwise = view $ "the role of " <> ttyMember m
|
|
where
|
|
view s = [ttyGroup' g <> ": you changed " <> s <> " from " <> showRole r <> " to " <> showRole r']
|
|
|
|
showRole :: GroupMemberRole -> StyledString
|
|
showRole = plain . strEncode
|
|
|
|
viewGroupMembers :: Group -> [StyledString]
|
|
viewGroupMembers (Group GroupInfo {membership} members) = map groupMember . filter (not . removedOrLeft) $ membership : members
|
|
where
|
|
removedOrLeft m = let s = memberStatus m in s == GSMemRemoved || s == GSMemLeft
|
|
groupMember m = memIncognito m <> ttyFullMember m <> ": " <> role m <> ", " <> category m <> status m
|
|
role m = plain . strEncode $ memberRole (m :: GroupMember)
|
|
category m = case memberCategory m of
|
|
GCUserMember -> "you, "
|
|
GCInviteeMember -> "invited, "
|
|
GCHostMember -> "host, "
|
|
_ -> ""
|
|
status m = case memberStatus m of
|
|
GSMemRemoved -> "removed"
|
|
GSMemLeft -> "left"
|
|
GSMemInvited -> "not yet joined"
|
|
GSMemConnected -> "connected"
|
|
GSMemComplete -> "connected"
|
|
GSMemCreator -> "created group"
|
|
_ -> ""
|
|
|
|
viewContactConnected :: Contact -> Maybe Profile -> Bool -> [StyledString]
|
|
viewContactConnected ct@Contact {localDisplayName} userIncognitoProfile testView =
|
|
case userIncognitoProfile of
|
|
Just profile ->
|
|
if testView
|
|
then incognitoProfile' profile : message
|
|
else message
|
|
where
|
|
message =
|
|
[ ttyFullContact ct <> ": contact is connected, your incognito profile for this contact is " <> incognitoProfile' profile,
|
|
"use " <> highlight ("/i " <> localDisplayName) <> " to print out this incognito profile again"
|
|
]
|
|
Nothing ->
|
|
[ttyFullContact ct <> ": contact is connected"]
|
|
|
|
viewGroupsList :: [(GroupInfo, GroupSummary)] -> [StyledString]
|
|
viewGroupsList [] = ["you have no groups!", "to create: " <> highlight' "/g <name>"]
|
|
viewGroupsList gs = map groupSS $ sortOn ldn_ gs
|
|
where
|
|
ldn_ = T.toLower . (localDisplayName :: GroupInfo -> GroupName) . fst
|
|
groupSS (g@GroupInfo {localDisplayName = ldn, groupProfile = GroupProfile {fullName}, membership, chatSettings}, GroupSummary {currentMembers}) =
|
|
case memberStatus membership of
|
|
GSMemInvited -> groupInvitation' g
|
|
s -> membershipIncognito g <> ttyGroup ldn <> optFullName ldn fullName <> viewMemberStatus s
|
|
where
|
|
viewMemberStatus = \case
|
|
GSMemRemoved -> delete "you are removed"
|
|
GSMemLeft -> delete "you left"
|
|
GSMemGroupDeleted -> delete "group deleted"
|
|
_
|
|
| enableNtfs chatSettings -> " (" <> memberCount <> ")"
|
|
| otherwise -> " (" <> memberCount <> ", muted, you can " <> highlight ("/unmute #" <> ldn) <> ")"
|
|
delete reason = " (" <> reason <> ", delete local copy: " <> highlight ("/d #" <> ldn) <> ")"
|
|
memberCount = sShow currentMembers <> " member" <> if currentMembers == 1 then "" else "s"
|
|
|
|
groupInvitation' :: GroupInfo -> StyledString
|
|
groupInvitation' GroupInfo {localDisplayName = ldn, groupProfile = GroupProfile {fullName}, membership = membership@GroupMember {memberProfile}} =
|
|
highlight ("#" <> ldn)
|
|
<> optFullName ldn fullName
|
|
<> " - you are invited ("
|
|
<> highlight ("/j " <> ldn)
|
|
<> joinText
|
|
<> highlight ("/d #" <> ldn)
|
|
<> " to delete invitation)"
|
|
where
|
|
joinText =
|
|
if memberIncognito membership
|
|
then " to join as " <> incognitoProfile' (fromLocalProfile memberProfile) <> ", "
|
|
else " to join, "
|
|
|
|
viewContactsMerged :: Contact -> Contact -> [StyledString]
|
|
viewContactsMerged _into@Contact {localDisplayName = c1} _merged@Contact {localDisplayName = c2} =
|
|
[ "contact " <> ttyContact c2 <> " is merged into " <> ttyContact c1,
|
|
"use " <> ttyToContact c1 <> highlight' "<message>" <> " to send messages"
|
|
]
|
|
|
|
viewUserProfile :: Profile -> [StyledString]
|
|
viewUserProfile Profile {displayName, fullName} =
|
|
[ "user profile: " <> ttyFullName displayName fullName,
|
|
"use " <> highlight' "/p <display name> [<full name>]" <> " to change it",
|
|
"(the updated profile will be sent to all your contacts)"
|
|
]
|
|
|
|
viewUserPrivacy :: User -> User -> [StyledString]
|
|
viewUserPrivacy User {userId} User {userId = userId', localDisplayName = n', showNtfs, viewPwdHash} =
|
|
[ (if userId == userId' then "current " else "") <> "user " <> plain n' <> ":",
|
|
"messages are " <> if showNtfs then "shown" else "hidden (use /tail to view)",
|
|
"profile is " <> if isJust viewPwdHash then "hidden" else "visible"
|
|
]
|
|
|
|
viewUserServers :: AUserProtoServers -> Bool -> [StyledString]
|
|
viewUserServers (AUPS UserProtoServers {serverProtocol = p, protoServers, presetServers}) testView =
|
|
customServers
|
|
<> if testView
|
|
then []
|
|
else
|
|
[ "",
|
|
"use " <> highlight (srvCmd <> " test <srv>") <> " to test " <> pName <> " server connection",
|
|
"use " <> highlight (srvCmd <> " <srv1[,srv2,...]>") <> " to configure " <> pName <> " servers",
|
|
"use " <> highlight (srvCmd <> " default") <> " to remove configured " <> pName <> " servers and use presets"
|
|
]
|
|
<> case p of
|
|
SPSMP -> ["(chat option " <> highlight' "-s" <> " (" <> highlight' "--server" <> ") has precedence over saved SMP servers for chat session)"]
|
|
SPXFTP -> ["(chat option " <> highlight' "-xftp-servers" <> " has precedence over saved XFTP servers for chat session)"]
|
|
where
|
|
srvCmd = "/" <> strEncode p
|
|
pName = protocolName p
|
|
customServers =
|
|
if null protoServers
|
|
then ("no " <> pName <> " servers saved, using presets: ") : viewServers id presetServers
|
|
else viewServers (\ServerCfg {server} -> server) protoServers
|
|
|
|
protocolName :: ProtocolTypeI p => SProtocolType p -> StyledString
|
|
protocolName = plain . map toUpper . T.unpack . decodeLatin1 . strEncode
|
|
|
|
viewServerTestResult :: AProtoServerWithAuth -> Maybe ProtocolTestFailure -> [StyledString]
|
|
viewServerTestResult (AProtoServerWithAuth p _) = \case
|
|
Just ProtocolTestFailure {testStep, testError} ->
|
|
result
|
|
<> [pName <> " server requires authorization to create queues, check password" | testStep == TSCreateQueue && testError == SMP SMP.AUTH]
|
|
<> [pName <> " server requires authorization to upload files, check password" | testStep == TSCreateFile && testError == XFTP XFTP.AUTH]
|
|
<> ["Possibly, certificate fingerprint in " <> pName <> " server address is incorrect" | testStep == TSConnect && brokerErr]
|
|
where
|
|
result = [pName <> " server test failed at " <> plain (drop 2 $ show testStep) <> ", error: " <> plain (strEncode testError)]
|
|
brokerErr = case testError of
|
|
BROKER _ NETWORK -> True
|
|
_ -> False
|
|
_ -> [pName <> " server test passed"]
|
|
where
|
|
pName = protocolName p
|
|
|
|
viewChatItemTTL :: Maybe Int64 -> [StyledString]
|
|
viewChatItemTTL = \case
|
|
Nothing -> ["old messages are not being deleted"]
|
|
Just ttl
|
|
| ttl == 86400 -> deletedAfter "one day"
|
|
| ttl == 7 * 86400 -> deletedAfter "one week"
|
|
| ttl == 30 * 86400 -> deletedAfter "one month"
|
|
| otherwise -> deletedAfter $ sShow ttl <> " second(s)"
|
|
where
|
|
deletedAfter ttlStr = ["old messages are set to be deleted after: " <> ttlStr]
|
|
|
|
viewNetworkConfig :: NetworkConfig -> [StyledString]
|
|
viewNetworkConfig NetworkConfig {socksProxy, tcpTimeout} =
|
|
[ plain $ maybe "direct network connection" (("using SOCKS5 proxy " <>) . show) socksProxy,
|
|
"TCP timeout: " <> sShow tcpTimeout,
|
|
"use " <> highlight' "/network socks=<on/off/[ipv4]:port>[ timeout=<seconds>]" <> " to change settings"
|
|
]
|
|
|
|
viewContactInfo :: Contact -> ConnectionStats -> Maybe Profile -> [StyledString]
|
|
viewContactInfo ct@Contact {contactId, profile = LocalProfile {localAlias, contactLink}} stats incognitoProfile =
|
|
["contact ID: " <> sShow contactId]
|
|
<> viewConnectionStats stats
|
|
<> maybe [] (\l -> ["contact address: " <> (plain . strEncode) l]) contactLink
|
|
<> maybe
|
|
["you've shared main profile with this contact"]
|
|
(\p -> ["you've shared incognito profile with this contact: " <> incognitoProfile' p])
|
|
incognitoProfile
|
|
<> ["alias: " <> plain localAlias | localAlias /= ""]
|
|
<> [viewConnectionVerified (contactSecurityCode ct)]
|
|
|
|
viewGroupInfo :: GroupInfo -> GroupSummary -> [StyledString]
|
|
viewGroupInfo GroupInfo {groupId} s =
|
|
[ "group ID: " <> sShow groupId,
|
|
"current members: " <> sShow (currentMembers s)
|
|
]
|
|
|
|
viewGroupMemberInfo :: GroupInfo -> GroupMember -> Maybe ConnectionStats -> [StyledString]
|
|
viewGroupMemberInfo GroupInfo {groupId} m@GroupMember {groupMemberId, memberProfile = LocalProfile {localAlias}} stats =
|
|
[ "group ID: " <> sShow groupId,
|
|
"member ID: " <> sShow groupMemberId
|
|
]
|
|
<> maybe ["member not connected"] viewConnectionStats stats
|
|
<> ["alias: " <> plain localAlias | localAlias /= ""]
|
|
<> [viewConnectionVerified (memberSecurityCode m) | isJust stats]
|
|
|
|
viewConnectionVerified :: Maybe SecurityCode -> StyledString
|
|
viewConnectionVerified (Just _) = "connection verified" -- TODO show verification time?
|
|
viewConnectionVerified _ = "connection not verified, use " <> highlight' "/code" <> " command to see security code"
|
|
|
|
viewConnectionStats :: ConnectionStats -> [StyledString]
|
|
viewConnectionStats ConnectionStats {rcvQueuesInfo, sndQueuesInfo} =
|
|
["receiving messages via: " <> viewRcvQueuesInfo rcvQueuesInfo | not $ null rcvQueuesInfo]
|
|
<> ["sending messages via: " <> viewSndQueuesInfo sndQueuesInfo | not $ null sndQueuesInfo]
|
|
|
|
viewServers :: ProtocolTypeI p => (a -> ProtoServerWithAuth p) -> NonEmpty a -> [StyledString]
|
|
viewServers f = map (plain . B.unpack . strEncode . f) . L.toList
|
|
|
|
viewRcvQueuesInfo :: [RcvQueueInfo] -> StyledString
|
|
viewRcvQueuesInfo = plain . intercalate ", " . map showQueueInfo
|
|
where
|
|
showQueueInfo RcvQueueInfo {rcvServer, rcvSwitchStatus, canAbortSwitch} =
|
|
let switchCanBeAborted = if canAbortSwitch then ", can be aborted" else ""
|
|
in showSMPServer rcvServer
|
|
<> maybe "" (\s -> " (" <> showSwitchStatus s <> switchCanBeAborted <> ")") rcvSwitchStatus
|
|
showSwitchStatus = \case
|
|
RSSwitchStarted -> "switch started"
|
|
RSSendingQADD -> "switch started"
|
|
RSSendingQUSE -> "switch confirmed"
|
|
RSReceivedMessage -> "switch secured"
|
|
|
|
viewSndQueuesInfo :: [SndQueueInfo] -> StyledString
|
|
viewSndQueuesInfo = plain . intercalate ", " . map showQueueInfo
|
|
where
|
|
showQueueInfo SndQueueInfo {sndServer, sndSwitchStatus} =
|
|
showSMPServer sndServer
|
|
<> maybe "" (\s -> " (" <> showSwitchStatus s <> ")") sndSwitchStatus
|
|
showSwitchStatus = \case
|
|
SSSendingQKEY -> "switch started"
|
|
SSSendingQTEST -> "switch secured"
|
|
|
|
viewContactSwitch :: Contact -> SwitchProgress -> [StyledString]
|
|
viewContactSwitch _ (SwitchProgress _ SPConfirmed _) = []
|
|
viewContactSwitch _ (SwitchProgress _ SPSecured _) = []
|
|
viewContactSwitch ct (SwitchProgress qd phase _) = case qd of
|
|
QDRcv -> [ttyContact' ct <> ": you " <> viewSwitchPhase phase]
|
|
QDSnd -> [ttyContact' ct <> " " <> viewSwitchPhase phase <> " for you"]
|
|
|
|
viewGroupMemberSwitch :: GroupInfo -> GroupMember -> SwitchProgress -> [StyledString]
|
|
viewGroupMemberSwitch _ _ (SwitchProgress _ SPConfirmed _) = []
|
|
viewGroupMemberSwitch _ _ (SwitchProgress _ SPSecured _) = []
|
|
viewGroupMemberSwitch g m (SwitchProgress qd phase _) = case qd of
|
|
QDRcv -> [ttyGroup' g <> ": you " <> viewSwitchPhase phase <> " for " <> ttyMember m]
|
|
QDSnd -> [ttyGroup' g <> ": " <> ttyMember m <> " " <> viewSwitchPhase phase <> " for you"]
|
|
|
|
viewContactRatchetSync :: Contact -> RatchetSyncProgress -> [StyledString]
|
|
viewContactRatchetSync ct@Contact {localDisplayName = c} RatchetSyncProgress {ratchetSyncStatus = rss} =
|
|
[ttyContact' ct <> ": " <> (plain . ratchetSyncStatusToText) rss]
|
|
<> help
|
|
where
|
|
help = ["use " <> highlight ("/sync " <> c) <> " to synchronize" | rss `elem` [RSAllowed, RSRequired]]
|
|
|
|
viewGroupMemberRatchetSync :: GroupInfo -> GroupMember -> RatchetSyncProgress -> [StyledString]
|
|
viewGroupMemberRatchetSync g m@GroupMember {localDisplayName = n} RatchetSyncProgress {ratchetSyncStatus = rss} =
|
|
[ttyGroup' g <> " " <> ttyMember m <> ": " <> (plain . ratchetSyncStatusToText) rss]
|
|
<> help
|
|
where
|
|
help = ["use " <> highlight ("/sync #" <> groupName' g <> " " <> n) <> " to synchronize" | rss `elem` [RSAllowed, RSRequired]]
|
|
|
|
viewContactVerificationReset :: Contact -> [StyledString]
|
|
viewContactVerificationReset ct =
|
|
[ttyContact' ct <> ": security code changed"]
|
|
|
|
viewGroupMemberVerificationReset :: GroupInfo -> GroupMember -> [StyledString]
|
|
viewGroupMemberVerificationReset g m =
|
|
[ttyGroup' g <> " " <> ttyMember m <> ": security code changed"]
|
|
|
|
viewContactCode :: Contact -> Text -> Bool -> [StyledString]
|
|
viewContactCode ct@Contact {localDisplayName = c} = viewSecurityCode (ttyContact' ct) ("/verify " <> c <> " <code from your contact>")
|
|
|
|
viewGroupMemberCode :: GroupInfo -> GroupMember -> Text -> Bool -> [StyledString]
|
|
viewGroupMemberCode g m@GroupMember {localDisplayName = n} = viewSecurityCode (ttyGroup' g <> " " <> ttyMember m) ("/verify #" <> groupName' g <> " " <> n <> " <code from your contact>")
|
|
|
|
viewSecurityCode :: StyledString -> Text -> Text -> Bool -> [StyledString]
|
|
viewSecurityCode name cmd code testView
|
|
| testView = [plain code]
|
|
| otherwise = [name <> " security code:", plain code, "pass this code to your contact and use " <> highlight cmd <> " to verify"]
|
|
|
|
viewSwitchPhase :: SwitchPhase -> StyledString
|
|
viewSwitchPhase = \case
|
|
SPStarted -> "started changing address"
|
|
SPConfirmed -> "confirmed changing address"
|
|
SPSecured -> "secured new address"
|
|
SPCompleted -> "changed address"
|
|
|
|
viewUserProfileUpdated :: Profile -> Profile -> UserProfileUpdateSummary -> [StyledString]
|
|
viewUserProfileUpdated Profile {displayName = n, fullName, image, contactLink, preferences} Profile {displayName = n', fullName = fullName', image = image', contactLink = contactLink', preferences = prefs'} summary =
|
|
profileUpdated <> viewPrefsUpdated preferences prefs'
|
|
where
|
|
UserProfileUpdateSummary {updateSuccesses = s, updateFailures = f} = summary
|
|
profileUpdated
|
|
| n == n' && fullName == fullName' && image == image' && contactLink == contactLink' = []
|
|
| n == n' && fullName == fullName' && image == image' = [if isNothing contactLink' then "contact address removed" else "new contact address set"]
|
|
| n == n' && fullName == fullName' = [if isNothing image' then "profile image removed" else "profile image updated"]
|
|
| n == n' = ["user full name " <> (if T.null fullName' || fullName' == n' then "removed" else "changed to " <> plain fullName') <> notified]
|
|
| otherwise = ["user profile is changed to " <> ttyFullName n' fullName' <> notified]
|
|
notified = " (your " <> sShow s <> " contacts are notified" <> failures <> ")"
|
|
failures
|
|
| f > 0 = ", " <> sShow f <> " failures"
|
|
| otherwise = ""
|
|
|
|
viewUserProfileImage :: Profile -> [StyledString]
|
|
viewUserProfileImage Profile {image} = case image of
|
|
Just (ImageData img) -> ["Profile image:", plain img]
|
|
_ -> ["No profile image"]
|
|
|
|
viewUserContactPrefsUpdated :: User -> Contact -> Contact -> [StyledString]
|
|
viewUserContactPrefsUpdated user ct ct'@Contact {mergedPreferences = cups}
|
|
| null prefs = ["your preferences for " <> ttyContact' ct' <> " did not change"]
|
|
| otherwise = ("you updated preferences for " <> ttyContact' ct' <> ":") : prefs
|
|
where
|
|
prefs = viewContactPreferences user ct ct' cups
|
|
|
|
viewContactPrefsUpdated :: User -> Contact -> Contact -> [StyledString]
|
|
viewContactPrefsUpdated user ct ct'@Contact {mergedPreferences = cups}
|
|
| null prefs = []
|
|
| otherwise = (ttyContact' ct' <> " updated preferences for you:") : prefs
|
|
where
|
|
prefs = viewContactPreferences user ct ct' cups
|
|
|
|
viewContactPreferences :: User -> Contact -> Contact -> ContactUserPreferences -> [StyledString]
|
|
viewContactPreferences user ct ct' cups =
|
|
mapMaybe (viewContactPref (mergeUserChatPrefs user ct) (mergeUserChatPrefs user ct') (preferences' ct) cups) allChatFeatures
|
|
|
|
viewContactPref :: FullPreferences -> FullPreferences -> Maybe Preferences -> ContactUserPreferences -> AChatFeature -> Maybe StyledString
|
|
viewContactPref userPrefs userPrefs' ctPrefs cups (ACF f)
|
|
| userPref == userPref' && ctPref == contactPreference = Nothing
|
|
| otherwise = Just . plain $ chatFeatureNameText' f <> ": " <> prefEnabledToText (chatFeature f) enabled (prefParam userPref') <> " (you allow: " <> countactUserPrefText userPreference <> ", contact allows: " <> preferenceText contactPreference <> ")"
|
|
where
|
|
userPref = getPreference f userPrefs
|
|
userPref' = getPreference f userPrefs'
|
|
ctPref = getPreference f ctPrefs
|
|
ContactUserPreference {enabled, userPreference, contactPreference} = getContactUserPreference f cups
|
|
|
|
viewPrefsUpdated :: Maybe Preferences -> Maybe Preferences -> [StyledString]
|
|
viewPrefsUpdated ps ps'
|
|
| null prefs = []
|
|
| otherwise = "updated preferences:" : prefs
|
|
where
|
|
prefs = mapMaybe viewPref allChatFeatures
|
|
viewPref (ACF f)
|
|
| pref ps == pref ps' = Nothing
|
|
| otherwise = Just . plain $ chatFeatureNameText' f <> " allowed: " <> preferenceText (pref ps')
|
|
where
|
|
pref pss = getPreference f $ mergePreferences pss Nothing
|
|
|
|
countactUserPrefText :: FeatureI f => ContactUserPref (FeaturePreference f) -> Text
|
|
countactUserPrefText cup = case cup of
|
|
CUPUser p -> "default (" <> preferenceText p <> ")"
|
|
CUPContact p -> preferenceText p
|
|
|
|
viewGroupUpdated :: GroupInfo -> GroupInfo -> Maybe GroupMember -> [StyledString]
|
|
viewGroupUpdated
|
|
GroupInfo {localDisplayName = n, groupProfile = GroupProfile {fullName, description, image, groupPreferences = gps}}
|
|
g'@GroupInfo {localDisplayName = n', groupProfile = GroupProfile {fullName = fullName', description = description', image = image', groupPreferences = gps'}}
|
|
m = do
|
|
let update = groupProfileUpdated <> groupPrefsUpdated
|
|
if null update
|
|
then []
|
|
else memberUpdated <> update
|
|
where
|
|
memberUpdated = maybe [] (\m' -> [ttyMember m' <> " updated group " <> ttyGroup n <> ":"]) m
|
|
groupProfileUpdated =
|
|
["changed to " <> ttyFullGroup g' | n /= n']
|
|
<> ["full name " <> if T.null fullName' || fullName' == n' then "removed" else "changed to: " <> plain fullName' | n == n' && fullName /= fullName']
|
|
<> ["profile image " <> maybe "removed" (const "updated") image' | image /= image']
|
|
<> (if description == description' then [] else maybe ["description removed"] ((bold' "description changed to:" :) . map plain . T.lines) description')
|
|
groupPrefsUpdated
|
|
| null prefs = []
|
|
| otherwise = bold' "updated group preferences:" : prefs
|
|
where
|
|
prefs = mapMaybe viewPref allGroupFeatures
|
|
viewPref (AGF f)
|
|
| pref gps == pref gps' = Nothing
|
|
| otherwise = Just . plain $ groupPreferenceText (pref gps')
|
|
where
|
|
pref = getGroupPreference f . mergeGroupPreferences
|
|
|
|
viewGroupProfile :: GroupInfo -> [StyledString]
|
|
viewGroupProfile g@GroupInfo {groupProfile = GroupProfile {description, image, groupPreferences = gps}} =
|
|
[ttyFullGroup g]
|
|
<> maybe [] (const ["has profile image"]) image
|
|
<> maybe [] ((bold' "description:" :) . map plain . T.lines) description
|
|
<> (bold' "group preferences:" : map viewPref allGroupFeatures)
|
|
where
|
|
viewPref (AGF f) = plain $ groupPreferenceText (pref gps)
|
|
where
|
|
pref = getGroupPreference f . mergeGroupPreferences
|
|
|
|
viewGroupDescription :: GroupInfo -> [StyledString]
|
|
viewGroupDescription GroupInfo {groupProfile = GroupProfile {description}} =
|
|
maybe ["No welcome message!"] ((bold' "Welcome message:" :) . map plain . T.lines) description
|
|
|
|
bold' :: String -> StyledString
|
|
bold' = styled Bold
|
|
|
|
viewContactAliasUpdated :: Contact -> [StyledString]
|
|
viewContactAliasUpdated Contact {localDisplayName = n, profile = LocalProfile {localAlias}}
|
|
| localAlias == "" = ["contact " <> ttyContact n <> " alias removed"]
|
|
| otherwise = ["contact " <> ttyContact n <> " alias updated: " <> plain localAlias]
|
|
|
|
viewConnectionAliasUpdated :: PendingContactConnection -> [StyledString]
|
|
viewConnectionAliasUpdated PendingContactConnection {pccConnId, localAlias}
|
|
| localAlias == "" = ["connection " <> sShow pccConnId <> " alias removed"]
|
|
| otherwise = ["connection " <> sShow pccConnId <> " alias updated: " <> plain localAlias]
|
|
|
|
viewConnectionIncognitoUpdated :: PendingContactConnection -> [StyledString]
|
|
viewConnectionIncognitoUpdated PendingContactConnection {pccConnId, customUserProfileId}
|
|
| isJust customUserProfileId = ["connection " <> sShow pccConnId <> " changed to incognito"]
|
|
| otherwise = ["connection " <> sShow pccConnId <> " changed to non incognito"]
|
|
|
|
viewContactUpdated :: Contact -> Contact -> [StyledString]
|
|
viewContactUpdated
|
|
Contact {localDisplayName = n, profile = LocalProfile {fullName, contactLink}}
|
|
Contact {localDisplayName = n', profile = LocalProfile {fullName = fullName', contactLink = contactLink'}}
|
|
| n == n' && fullName == fullName' && contactLink == contactLink' = []
|
|
| n == n' && fullName == fullName' =
|
|
if isNothing contactLink'
|
|
then [ttyContact n <> " removed contact address"]
|
|
else [ttyContact n <> " set new contact address, use " <> highlight ("/info " <> n) <> " to view"]
|
|
| n == n' = ["contact " <> ttyContact n <> fullNameUpdate]
|
|
| otherwise =
|
|
[ "contact " <> ttyContact n <> " changed to " <> ttyFullName n' fullName',
|
|
"use " <> ttyToContact n' <> highlight' "<message>" <> " to send messages"
|
|
]
|
|
where
|
|
fullNameUpdate = if T.null fullName' || fullName' == n' then " removed full name" else " updated full name: " <> plain fullName'
|
|
|
|
viewReceivedMessage :: StyledString -> [StyledString] -> MsgContent -> CurrentTime -> TimeZone -> CIMeta c d -> [StyledString]
|
|
viewReceivedMessage = viewReceivedMessage_ False
|
|
|
|
viewReceivedUpdatedMessage :: StyledString -> [StyledString] -> MsgContent -> CurrentTime -> TimeZone -> CIMeta c d -> [StyledString]
|
|
viewReceivedUpdatedMessage = viewReceivedMessage_ True
|
|
|
|
viewReceivedMessage_ :: Bool -> StyledString -> [StyledString] -> MsgContent -> CurrentTime -> TimeZone -> CIMeta c d -> [StyledString]
|
|
viewReceivedMessage_ updated from quote mc ts tz meta = receivedWithTime_ ts tz from quote meta (ttyMsgContent mc) updated
|
|
|
|
viewReceivedReaction :: StyledString -> [StyledString] -> StyledString -> CurrentTime -> TimeZone -> UTCTime -> [StyledString]
|
|
viewReceivedReaction from styledMsg reactionText ts tz reactionTs =
|
|
prependFirst (ttyMsgTime ts tz reactionTs <> " " <> from) (styledMsg <> [" " <> reactionText])
|
|
|
|
receivedWithTime_ :: CurrentTime -> TimeZone -> StyledString -> [StyledString] -> CIMeta c d -> [StyledString] -> Bool -> [StyledString]
|
|
receivedWithTime_ ts tz from quote CIMeta {itemId, itemTs, itemEdited, itemDeleted, itemLive} styledMsg updated = do
|
|
prependFirst (ttyMsgTime ts tz itemTs <> " " <> from) (quote <> prependFirst (indent <> live) styledMsg)
|
|
where
|
|
indent = if null quote then "" else " "
|
|
live
|
|
| itemEdited || isJust itemDeleted = ""
|
|
| otherwise = case itemLive of
|
|
Just True
|
|
| updated -> ttyFrom "[LIVE] "
|
|
| otherwise -> ttyFrom "[LIVE started]" <> " use " <> highlight' ("/show [on/off/" <> show itemId <> "] ")
|
|
Just False -> ttyFrom "[LIVE ended] "
|
|
_ -> ""
|
|
|
|
ttyMsgTime :: CurrentTime -> TimeZone -> UTCTime -> StyledString
|
|
ttyMsgTime now tz time =
|
|
let fmt = if recent now tz time then "%H:%M" else "%m-%d"
|
|
localTime = utcToLocalTime tz time
|
|
in styleTime $ formatTime defaultTimeLocale fmt localTime
|
|
|
|
recent :: CurrentTime -> TimeZone -> UTCTime -> Bool
|
|
recent now tz time = do
|
|
let localNow = utcToLocalTime tz now
|
|
localNowDay = localDay localNow
|
|
localTime = utcToLocalTime tz time
|
|
localTimeDay = localDay localTime
|
|
previousDay18 = LocalTime (addDays (-1) localNowDay) (TimeOfDay 18 0 0)
|
|
currentDay12 = LocalTime localNowDay (TimeOfDay 12 0 0)
|
|
localNowDay == localTimeDay
|
|
|| (localNow < currentDay12 && localTime >= previousDay18 && localTimeDay < localNowDay)
|
|
|
|
viewSentMessage :: StyledString -> [StyledString] -> MsgContent -> CurrentTime -> TimeZone -> CIMeta c d -> [StyledString]
|
|
viewSentMessage to quote mc ts tz meta@CIMeta {itemEdited, itemDeleted, itemLive} = sentWithTime_ ts tz (prependFirst to $ quote <> prependFirst (indent <> live) (ttyMsgContent mc)) meta
|
|
where
|
|
indent = if null quote then "" else " "
|
|
live
|
|
| itemEdited || isJust itemDeleted = ""
|
|
| otherwise = case itemLive of
|
|
Just True -> ttyTo "[LIVE started] "
|
|
Just False -> ttyTo "[LIVE] "
|
|
_ -> ""
|
|
|
|
viewSentBroadcast :: MsgContent -> Int -> Int -> CurrentTime -> TimeZone -> UTCTime -> [StyledString]
|
|
viewSentBroadcast mc s f ts tz time = prependFirst (highlight' "/feed" <> " (" <> sShow s <> failures <> ") " <> ttyMsgTime ts tz time <> " ") (ttyMsgContent mc)
|
|
where
|
|
failures
|
|
| f > 0 = ", " <> sShow f <> " failures"
|
|
| otherwise = ""
|
|
|
|
viewSentFileInvitation :: StyledString -> CIFile d -> CurrentTime -> TimeZone -> CIMeta c d -> [StyledString]
|
|
viewSentFileInvitation to CIFile {fileId, fileSource, fileStatus} ts tz = case fileSource of
|
|
Just (CryptoFile fPath _) -> sentWithTime_ ts tz $ ttySentFile fPath
|
|
_ -> const []
|
|
where
|
|
ttySentFile fPath = ["/f " <> to <> ttyFilePath fPath] <> cancelSending
|
|
cancelSending = case fileStatus of
|
|
CIFSSndTransfer _ _ -> []
|
|
_ -> ["use " <> highlight ("/fc " <> show fileId) <> " to cancel sending"]
|
|
|
|
sentWithTime_ :: CurrentTime -> TimeZone -> [StyledString] -> CIMeta c d -> [StyledString]
|
|
sentWithTime_ ts tz styledMsg CIMeta {itemTs} =
|
|
prependFirst (ttyMsgTime ts tz itemTs <> " ") styledMsg
|
|
|
|
ttyMsgContent :: MsgContent -> [StyledString]
|
|
ttyMsgContent = msgPlain . msgContentText
|
|
|
|
prependFirst :: StyledString -> [StyledString] -> [StyledString]
|
|
prependFirst s [] = [s]
|
|
prependFirst s (s' : ss) = (s <> s') : ss
|
|
|
|
msgPlain :: Text -> [StyledString]
|
|
msgPlain = map (styleMarkdownList . parseMarkdownList) . T.lines
|
|
|
|
viewRcvFileSndCancelled :: RcvFileTransfer -> [StyledString]
|
|
viewRcvFileSndCancelled ft@RcvFileTransfer {senderDisplayName = c} =
|
|
[ttyContact c <> " cancelled sending " <> rcvFile ft]
|
|
|
|
viewSndFileCancelled :: FileTransferMeta -> [SndFileTransfer] -> [StyledString]
|
|
viewSndFileCancelled FileTransferMeta {fileId, fileName} fts =
|
|
case filter (\SndFileTransfer {fileStatus = s} -> s /= FSCancelled && s /= FSComplete) fts of
|
|
[] -> ["cancelled sending " <> fileTransferStr fileId fileName]
|
|
ts -> ["cancelled sending " <> fileTransferStr fileId fileName <> " to " <> listRecipients ts]
|
|
|
|
sendingFile_ :: StyledString -> SndFileTransfer -> [StyledString]
|
|
sendingFile_ status ft@SndFileTransfer {recipientDisplayName = c} =
|
|
[status <> " sending " <> sndFile ft <> " to " <> ttyContact c]
|
|
|
|
uploadingFile :: StyledString -> AChatItem -> [StyledString]
|
|
uploadingFile status (AChatItem _ _ (DirectChat Contact {localDisplayName = c}) ChatItem {file = Just CIFile {fileId, fileName}, chatDir = CIDirectSnd}) =
|
|
[status <> " uploading " <> fileTransferStr fileId fileName <> " for " <> ttyContact c]
|
|
uploadingFile status (AChatItem _ _ (GroupChat g) ChatItem {file = Just CIFile {fileId, fileName}, chatDir = CIGroupSnd}) =
|
|
[status <> " uploading " <> fileTransferStr fileId fileName <> " for " <> ttyGroup' g]
|
|
uploadingFile status _ = [status <> " uploading file"] -- shouldn't happen
|
|
|
|
sndFile :: SndFileTransfer -> StyledString
|
|
sndFile SndFileTransfer {fileId, fileName} = fileTransferStr fileId fileName
|
|
|
|
viewReceivedFileInvitation :: StyledString -> CIFile d -> CurrentTime -> TimeZone -> CIMeta c d -> [StyledString]
|
|
viewReceivedFileInvitation from file ts tz meta = receivedWithTime_ ts tz from [] meta (receivedFileInvitation_ file) False
|
|
|
|
receivedFileInvitation_ :: CIFile d -> [StyledString]
|
|
receivedFileInvitation_ CIFile {fileId, fileName, fileSize, fileStatus} =
|
|
["sends file " <> ttyFilePath fileName <> " (" <> humanReadableSize fileSize <> " / " <> sShow fileSize <> " bytes)"]
|
|
<> case fileStatus of
|
|
CIFSRcvAccepted -> []
|
|
_ -> ["use " <> highlight ("/fr " <> show fileId <> " [<dir>/ | <path>]") <> " to receive it"]
|
|
|
|
humanReadableSize :: Integer -> StyledString
|
|
humanReadableSize size
|
|
| size < kB = sShow size <> " bytes"
|
|
| size < mB = hrSize kB "KiB"
|
|
| size < gB = hrSize mB "MiB"
|
|
| otherwise = hrSize gB "GiB"
|
|
where
|
|
hrSize sB name = plain $ unwords [showFFloat (Just 1) (fromIntegral size / (fromIntegral sB :: Double)) "", name]
|
|
kB = 1024
|
|
mB = kB * 1024
|
|
gB = mB * 1024
|
|
|
|
savingFile' :: Bool -> AChatItem -> [StyledString]
|
|
savingFile' testView (AChatItem _ _ chat ChatItem {file = Just CIFile {fileId, fileSource = Just (CryptoFile filePath cfArgs_)}, chatDir}) =
|
|
let from = case (chat, chatDir) of
|
|
(DirectChat Contact {localDisplayName = c}, CIDirectRcv) -> " from " <> ttyContact c
|
|
(_, CIGroupRcv GroupMember {localDisplayName = m}) -> " from " <> ttyContact m
|
|
_ -> ""
|
|
in ["saving file " <> sShow fileId <> from <> " to " <> plain filePath] <> cfArgsStr
|
|
where
|
|
cfArgsStr = case cfArgs_ of
|
|
Just cfArgs@(CFArgs key nonce)
|
|
| testView -> [plain $ LB.unpack $ J.encode cfArgs]
|
|
| otherwise -> [plain $ "encryption key: " <> strEncode key <> ", nonce: " <> strEncode nonce]
|
|
_ -> []
|
|
savingFile' _ _ = ["saving file"] -- shouldn't happen
|
|
|
|
receivingFile_' :: StyledString -> AChatItem -> [StyledString]
|
|
receivingFile_' status (AChatItem _ _ (DirectChat Contact {localDisplayName = c}) ChatItem {file = Just CIFile {fileId, fileName}, chatDir = CIDirectRcv}) =
|
|
[status <> " receiving " <> fileTransferStr fileId fileName <> " from " <> ttyContact c]
|
|
receivingFile_' status (AChatItem _ _ _ ChatItem {file = Just CIFile {fileId, fileName}, chatDir = CIGroupRcv GroupMember {localDisplayName = m}}) =
|
|
[status <> " receiving " <> fileTransferStr fileId fileName <> " from " <> ttyContact m]
|
|
receivingFile_' status _ = [status <> " receiving file"] -- shouldn't happen
|
|
|
|
receivingFile_ :: StyledString -> RcvFileTransfer -> [StyledString]
|
|
receivingFile_ status ft@RcvFileTransfer {senderDisplayName = c} =
|
|
[status <> " receiving " <> rcvFile ft <> " from " <> ttyContact c]
|
|
|
|
rcvFile :: RcvFileTransfer -> StyledString
|
|
rcvFile RcvFileTransfer {fileId, fileInvitation = FileInvitation {fileName}} = fileTransferStr fileId fileName
|
|
|
|
fileTransferStr :: Int64 -> String -> StyledString
|
|
fileTransferStr fileId fileName = "file " <> sShow fileId <> " (" <> ttyFilePath fileName <> ")"
|
|
|
|
viewFileTransferStatus :: (FileTransfer, [Integer]) -> [StyledString]
|
|
viewFileTransferStatus (FTSnd FileTransferMeta {fileId, fileName, cancelled} [], _) =
|
|
["sending " <> fileTransferStr fileId fileName <> ": no file transfers"]
|
|
<> ["file transfer cancelled" | cancelled]
|
|
viewFileTransferStatus (FTSnd FileTransferMeta {cancelled} fts@(ft : _), chunksNum) =
|
|
recipientStatuses <> ["file transfer cancelled" | cancelled]
|
|
where
|
|
recipientStatuses =
|
|
case concatMap recipientsTransferStatus $ groupBy ((==) `on` fs) $ sortOn fs fts of
|
|
[recipientsStatus] -> ["sending " <> sndFile ft <> " " <> recipientsStatus]
|
|
recipientsStatuses -> ("sending " <> sndFile ft <> ": ") : map (" " <>) recipientsStatuses
|
|
fs = fileStatus :: SndFileTransfer -> FileStatus
|
|
recipientsTransferStatus [] = []
|
|
recipientsTransferStatus ts@(SndFileTransfer {fileStatus, fileSize, chunkSize} : _) = [sndStatus <> ": " <> listRecipients ts]
|
|
where
|
|
sndStatus = case fileStatus of
|
|
FSNew -> "not accepted"
|
|
FSAccepted -> "just started"
|
|
FSConnected -> "in progress (" <> sShow (sum chunksNum * chunkSize * 100 `div` (toInteger (length chunksNum) * fileSize)) <> "%)"
|
|
FSComplete -> "complete"
|
|
FSCancelled -> "cancelled"
|
|
viewFileTransferStatus (FTRcv ft@RcvFileTransfer {fileId, fileInvitation = FileInvitation {fileSize}, fileStatus, chunkSize}, chunksNum) =
|
|
["receiving " <> rcvFile ft <> " " <> rcvStatus]
|
|
where
|
|
rcvStatus = case fileStatus of
|
|
RFSNew -> "not accepted yet, use " <> highlight ("/fr " <> show fileId) <> " to receive file"
|
|
RFSAccepted _ -> "just started"
|
|
RFSConnected _ -> "progress " <> fileProgress chunksNum chunkSize fileSize
|
|
RFSComplete RcvFileInfo {filePath} -> "complete, path: " <> plain filePath
|
|
RFSCancelled (Just RcvFileInfo {filePath}) -> "cancelled, received part path: " <> plain filePath
|
|
RFSCancelled Nothing -> "cancelled"
|
|
|
|
viewFileTransferStatusXFTP :: AChatItem -> [StyledString]
|
|
viewFileTransferStatusXFTP (AChatItem _ _ _ ChatItem {file = Just CIFile {fileId, fileName, fileSize, fileStatus, fileSource}}) =
|
|
case fileStatus of
|
|
CIFSSndStored -> ["sending " <> fstr <> " just started"]
|
|
CIFSSndTransfer progress total -> ["sending " <> fstr <> " in progress " <> fileProgressXFTP progress total fileSize]
|
|
CIFSSndCancelled -> ["sending " <> fstr <> " cancelled"]
|
|
CIFSSndComplete -> ["sending " <> fstr <> " complete"]
|
|
CIFSSndError -> ["sending " <> fstr <> " error"]
|
|
CIFSRcvInvitation -> ["receiving " <> fstr <> " not accepted yet, use " <> highlight ("/fr " <> show fileId) <> " to receive file"]
|
|
CIFSRcvAccepted -> ["receiving " <> fstr <> " just started"]
|
|
CIFSRcvTransfer progress total -> ["receiving " <> fstr <> " progress " <> fileProgressXFTP progress total fileSize]
|
|
CIFSRcvComplete -> ["receiving " <> fstr <> " complete" <> maybe "" (\(CryptoFile fp _) -> ", path: " <> plain fp) fileSource]
|
|
CIFSRcvCancelled -> ["receiving " <> fstr <> " cancelled"]
|
|
CIFSRcvError -> ["receiving " <> fstr <> " error"]
|
|
CIFSInvalid text -> [fstr <> " invalid status: " <> plain text]
|
|
where
|
|
fstr = fileTransferStr fileId fileName
|
|
viewFileTransferStatusXFTP _ = ["no file status"]
|
|
|
|
listRecipients :: [SndFileTransfer] -> StyledString
|
|
listRecipients = mconcat . intersperse ", " . map (ttyContact . recipientDisplayName)
|
|
|
|
fileProgress :: [Integer] -> Integer -> Integer -> StyledString
|
|
fileProgress chunksNum chunkSize fileSize =
|
|
sShow (sum chunksNum * chunkSize * 100 `div` fileSize) <> "% of " <> humanReadableSize fileSize
|
|
|
|
fileProgressXFTP :: Int64 -> Int64 -> Integer -> StyledString
|
|
fileProgressXFTP progress total fileSize =
|
|
sShow (progress * 100 `div` total) <> "% of " <> humanReadableSize fileSize
|
|
|
|
viewCallInvitation :: Contact -> CallType -> Maybe C.Key -> [StyledString]
|
|
viewCallInvitation ct@Contact {contactId} callType@CallType {media} sharedKey =
|
|
[ ttyContact' ct <> " wants to connect with you via WebRTC " <> callMediaStr callType <> " call " <> encryptedCallText callType,
|
|
"To accept the call, please open the link below in your browser" <> supporedBrowsers callType,
|
|
"",
|
|
"https://simplex.chat/call#" <> plain queryString
|
|
]
|
|
where
|
|
aesKey = B.unpack . strEncode . C.unKey <$> sharedKey
|
|
queryString =
|
|
Q.renderSimpleQuery
|
|
False
|
|
[ ("command", LB.toStrict . J.encode $ WCCallStart {media, aesKey, useWorker = True}),
|
|
("contact_id", B.pack $ show contactId)
|
|
]
|
|
|
|
viewCallOffer :: Contact -> CallType -> WebRTCSession -> Maybe C.Key -> [StyledString]
|
|
viewCallOffer ct@Contact {contactId} callType@CallType {media} WebRTCSession {rtcSession = offer, rtcIceCandidates = iceCandidates} sharedKey =
|
|
[ ttyContact' ct <> " accepted your WebRTC " <> callMediaStr callType <> " call " <> encryptedCallText callType,
|
|
"To connect, please open the link below in your browser" <> supporedBrowsers callType,
|
|
"",
|
|
"https://simplex.chat/call#" <> plain queryString
|
|
]
|
|
where
|
|
aesKey = B.unpack . strEncode . C.unKey <$> sharedKey
|
|
queryString =
|
|
Q.renderSimpleQuery
|
|
False
|
|
[ ("command", LB.toStrict . J.encode $ WCCallOffer {offer, iceCandidates, media, aesKey, useWorker = True}),
|
|
("contact_id", B.pack $ show contactId)
|
|
]
|
|
|
|
viewCallAnswer :: Contact -> WebRTCSession -> [StyledString]
|
|
viewCallAnswer ct WebRTCSession {rtcSession = answer, rtcIceCandidates = iceCandidates} =
|
|
[ ttyContact' ct <> " continued the WebRTC call",
|
|
"To connect, please paste the data below in your browser window you opened earlier and click Connect button",
|
|
"",
|
|
plain . LB.toStrict . J.encode $ WCCallAnswer {answer, iceCandidates}
|
|
]
|
|
|
|
callMediaStr :: CallType -> StyledString
|
|
callMediaStr CallType {media} = case media of
|
|
CMVideo -> "video"
|
|
CMAudio -> "audio"
|
|
|
|
encryptedCallText :: CallType -> StyledString
|
|
encryptedCallText callType
|
|
| encryptedCall callType = "(e2e encrypted)"
|
|
| otherwise = "(not e2e encrypted)"
|
|
|
|
supporedBrowsers :: CallType -> StyledString
|
|
supporedBrowsers callType
|
|
| encryptedCall callType = " (only Chrome and Safari support e2e encryption for WebRTC, Safari may require enabling WebRTC insertable streams)"
|
|
| otherwise = ""
|
|
|
|
data WCallCommand
|
|
= WCCallStart {media :: CallMedia, aesKey :: Maybe String, useWorker :: Bool}
|
|
| WCCallOffer {offer :: Text, iceCandidates :: Text, media :: CallMedia, aesKey :: Maybe String, useWorker :: Bool}
|
|
| WCCallAnswer {answer :: Text, iceCandidates :: Text}
|
|
deriving (Generic)
|
|
|
|
instance ToJSON WCallCommand where
|
|
toEncoding = J.genericToEncoding . taggedObjectJSON $ dropPrefix "WCCall"
|
|
toJSON = J.genericToJSON . taggedObjectJSON $ dropPrefix "WCCall"
|
|
|
|
viewVersionInfo :: ChatLogLevel -> CoreVersionInfo -> [StyledString]
|
|
viewVersionInfo logLevel CoreVersionInfo {version, simplexmqVersion, simplexmqCommit} =
|
|
map plain $
|
|
if logLevel <= CLLInfo
|
|
then [versionString version, updateStr, "simplexmq: " <> simplexmqVersion <> parens simplexmqCommit]
|
|
else [versionString version, updateStr]
|
|
where
|
|
parens s = " (" <> s <> ")"
|
|
|
|
viewChatError :: ChatLogLevel -> ChatError -> [StyledString]
|
|
viewChatError logLevel = \case
|
|
ChatError err -> case err of
|
|
CENoActiveUser -> ["error: active user is required"]
|
|
CENoConnectionUser agentConnId -> ["error: message user not found, conn id: " <> sShow agentConnId | logLevel <= CLLError]
|
|
CENoSndFileUser aFileId -> ["error: snd file user not found, file id: " <> sShow aFileId | logLevel <= CLLError]
|
|
CENoRcvFileUser aFileId -> ["error: rcv file user not found, file id: " <> sShow aFileId | logLevel <= CLLError]
|
|
CEActiveUserExists -> ["error: active user already exists"]
|
|
CEUserExists name -> ["user with the name " <> ttyContact name <> " already exists"]
|
|
CEUserUnknown -> ["user does not exist or incorrect password"]
|
|
CEDifferentActiveUser commandUserId activeUserId -> ["error: different active user, command user id: " <> sShow commandUserId <> ", active user id: " <> sShow activeUserId]
|
|
CECantDeleteActiveUser _ -> ["cannot delete active user"]
|
|
CECantDeleteLastUser _ -> ["cannot delete last user"]
|
|
CECantHideLastUser _ -> ["cannot hide the only not hidden user"]
|
|
CEHiddenUserAlwaysMuted _ -> ["hidden user always muted when inactive"]
|
|
CEEmptyUserPassword _ -> ["user password is required"]
|
|
CEUserAlreadyHidden _ -> ["user is already hidden"]
|
|
CEUserNotHidden _ -> ["user is not hidden"]
|
|
CEChatNotStarted -> ["error: chat not started"]
|
|
CEChatNotStopped -> ["error: chat not stopped"]
|
|
CEChatStoreChanged -> ["error: chat store changed, please restart chat"]
|
|
CEInvalidConnReq -> viewInvalidConnReq
|
|
CEInvalidChatMessage Connection {connId} msgMeta_ msg e ->
|
|
[ plain $
|
|
("chat message error: " <> e <> " (" <> T.unpack (T.take 120 msg) <> ")")
|
|
<> (", connection id: " <> show connId)
|
|
<> maybe "" (\MsgMetaJSON {rcvId} -> ", agent msg rcv id: " <> show rcvId) msgMeta_
|
|
]
|
|
CEContactNotReady c -> [ttyContact' c <> ": not ready"]
|
|
CEContactDisabled Contact {localDisplayName = c} -> [ttyContact c <> ": disabled, to enable: " <> highlight ("/enable " <> c) <> ", to delete: " <> highlight ("/d " <> c)]
|
|
CEConnectionDisabled Connection {connId, connType} -> [plain $ "connection " <> textEncode connType <> " (" <> tshow connId <> ") is disabled" | logLevel <= CLLWarning]
|
|
CEGroupDuplicateMember c -> ["contact " <> ttyContact c <> " is already in the group"]
|
|
CEGroupDuplicateMemberId -> ["cannot add member - duplicate member ID"]
|
|
CEGroupUserRole g role ->
|
|
(: []) . (ttyGroup' g <>) $ case role of
|
|
GRAuthor -> ": you don't have permission to send messages"
|
|
_ -> ": you have insufficient permissions for this action, the required role is " <> plain (strEncode role)
|
|
CEGroupMemberInitialRole g role -> [ttyGroup' g <> ": initial role for group member cannot be " <> plain (strEncode role) <> ", use member or observer"]
|
|
CEContactIncognitoCantInvite -> ["you're using your main profile for this group - prohibited to invite contacts to whom you are connected incognito"]
|
|
CEGroupIncognitoCantInvite -> ["you've connected to this group using an incognito profile - prohibited to invite contacts"]
|
|
CEGroupContactRole c -> ["contact " <> ttyContact c <> " has insufficient permissions for this group action"]
|
|
CEGroupNotJoined g -> ["you did not join this group, use " <> highlight ("/join #" <> groupName' g)]
|
|
CEGroupMemberNotActive -> ["your group connection is not active yet, try later"]
|
|
CEGroupMemberUserRemoved -> ["you are no longer a member of the group"]
|
|
CEGroupMemberNotFound -> ["group doesn't have this member"]
|
|
CEGroupMemberIntroNotFound c -> ["group member intro not found for " <> ttyContact c]
|
|
CEGroupCantResendInvitation g c -> viewCannotResendInvitation g c
|
|
CEGroupInternal s -> ["chat group bug: " <> plain s]
|
|
CEFileNotFound f -> ["file not found: " <> plain f]
|
|
CEFileSize f -> ["file size exceeds the limit: " <> plain f]
|
|
CEFileAlreadyReceiving f -> ["file is already being received: " <> plain f]
|
|
CEFileCancelled f -> ["file cancelled: " <> plain f]
|
|
CEFileCancel fileId e -> ["error cancelling file " <> sShow fileId <> ": " <> sShow e]
|
|
CEFileAlreadyExists f -> ["file already exists: " <> plain f]
|
|
CEFileRead f e -> ["cannot read file " <> plain f, sShow e]
|
|
CEFileWrite f e -> ["cannot write file " <> plain f, sShow e]
|
|
CEFileSend fileId e -> ["error sending file " <> sShow fileId <> ": " <> sShow e]
|
|
CEFileRcvChunk e -> ["error receiving file: " <> plain e]
|
|
CEFileInternal e -> ["file error: " <> plain e]
|
|
CEFileImageType _ -> ["image type must be jpg, send as a file using " <> highlight' "/f"]
|
|
CEFileImageSize _ -> ["max image size: " <> sShow maxImageSize <> " bytes, resize it or send as a file using " <> highlight' "/f"]
|
|
CEFileNotReceived fileId -> ["file " <> sShow fileId <> " not received"]
|
|
CEXFTPRcvFile fileId aFileId e -> ["error receiving XFTP file " <> sShow fileId <> ", agent file id " <> sShow aFileId <> ": " <> sShow e | logLevel == CLLError]
|
|
CEXFTPSndFile fileId aFileId e -> ["error sending XFTP file " <> sShow fileId <> ", agent file id " <> sShow aFileId <> ": " <> sShow e | logLevel == CLLError]
|
|
CEFallbackToSMPProhibited fileId -> ["recipient tried to accept file " <> sShow fileId <> " via old protocol, prohibited"]
|
|
CEInlineFileProhibited _ -> ["A small file sent without acceptance - you can enable receiving such files with -f option."]
|
|
CEInvalidQuote -> ["cannot reply to this message"]
|
|
CEInvalidChatItemUpdate -> ["cannot update this item"]
|
|
CEInvalidChatItemDelete -> ["cannot delete this item"]
|
|
CEHasCurrentCall -> ["call already in progress"]
|
|
CENoCurrentCall -> ["no call in progress"]
|
|
CECallContact _ -> []
|
|
CECallState _ -> []
|
|
CEDirectMessagesProhibited dir ct -> viewDirectMessagesProhibited dir ct
|
|
CEAgentVersion -> ["unsupported agent version"]
|
|
CEAgentNoSubResult connId -> ["no subscription result for connection: " <> sShow connId]
|
|
CEServerProtocol p -> [plain $ "Servers for protocol " <> strEncode p <> " cannot be configured by the users"]
|
|
CECommandError e -> ["bad chat command: " <> plain e]
|
|
CEAgentCommandError e -> ["agent command error: " <> plain e]
|
|
CEInvalidFileDescription e -> ["invalid file description: " <> plain e]
|
|
CEConnectionIncognitoChangeProhibited -> ["incognito mode change prohibited"]
|
|
CEInternalError e -> ["internal chat error: " <> plain e]
|
|
CEException e -> ["exception: " <> plain e]
|
|
-- e -> ["chat error: " <> sShow e]
|
|
ChatErrorStore err -> case err of
|
|
SEDuplicateName -> ["this display name is already used by user, contact or group"]
|
|
SEUserNotFoundByName u -> ["no user " <> ttyContact u]
|
|
SEContactNotFoundByName c -> ["no contact " <> ttyContact c]
|
|
SEContactNotReady c -> ["contact " <> ttyContact c <> " is not active yet"]
|
|
SEGroupNotFoundByName g -> ["no group " <> ttyGroup g]
|
|
SEGroupAlreadyJoined -> ["you already joined this group"]
|
|
SEFileNotFound fileId -> fileNotFound fileId
|
|
SESndFileNotFound fileId -> fileNotFound fileId
|
|
SERcvFileNotFound fileId -> fileNotFound fileId
|
|
SEDuplicateContactLink -> ["you already have chat address, to show: " <> highlight' "/sa"]
|
|
SEUserContactLinkNotFound -> ["no chat address, to create: " <> highlight' "/ad"]
|
|
SEContactRequestNotFoundByName c -> ["no contact request from " <> ttyContact c]
|
|
SEFileIdNotFoundBySharedMsgId _ -> [] -- recipient tried to accept cancelled file
|
|
SEConnectionNotFound agentConnId -> ["event connection not found, agent ID: " <> sShow agentConnId | logLevel <= CLLWarning] -- mutes delete group error
|
|
SEChatItemNotFoundByText text -> ["message not found by text: " <> plain text]
|
|
SEDuplicateGroupLink g -> ["you already have link for this group, to show: " <> highlight ("/show link #" <> groupName' g)]
|
|
SEGroupLinkNotFound g -> ["no group link, to create: " <> highlight ("/create link #" <> groupName' g)]
|
|
e -> ["chat db error: " <> sShow e]
|
|
ChatErrorDatabase err -> case err of
|
|
DBErrorEncrypted -> ["error: chat database is already encrypted"]
|
|
DBErrorPlaintext -> ["error: chat database is not encrypted"]
|
|
DBErrorExport e -> ["error encrypting database: " <> sqliteError' e]
|
|
DBErrorOpen e -> ["error opening database after encryption: " <> sqliteError' e]
|
|
e -> ["chat database error: " <> sShow e]
|
|
ChatErrorAgent err entity_ -> case err of
|
|
CMD PROHIBITED -> [withConnEntity <> "error: command is prohibited"]
|
|
SMP SMP.AUTH ->
|
|
[ withConnEntity
|
|
<> "error: connection authorization failed - this could happen if connection was deleted,\
|
|
\ secured with different credentials, or due to a bug - please re-create the connection"
|
|
]
|
|
AGENT A_DUPLICATE -> [withConnEntity <> "error: AGENT A_DUPLICATE" | logLevel == CLLDebug]
|
|
AGENT A_PROHIBITED -> [withConnEntity <> "error: AGENT A_PROHIBITED" | logLevel <= CLLWarning]
|
|
CONN NOT_FOUND -> [withConnEntity <> "error: CONN NOT_FOUND" | logLevel <= CLLWarning]
|
|
e -> [withConnEntity <> "smp agent error: " <> sShow e | logLevel <= CLLWarning]
|
|
where
|
|
withConnEntity = case entity_ of
|
|
Just entity@(RcvDirectMsgConnection conn contact_) -> case contact_ of
|
|
Just Contact {contactId} ->
|
|
"[" <> connEntityLabel entity <> ", contactId: " <> sShow contactId <> ", connId: " <> cId conn <> "] "
|
|
Nothing ->
|
|
"[" <> connEntityLabel entity <> ", connId: " <> cId conn <> "] "
|
|
Just entity@(RcvGroupMsgConnection conn GroupInfo {groupId} GroupMember {groupMemberId}) ->
|
|
"[" <> connEntityLabel entity <> ", groupId: " <> sShow groupId <> ", memberId: " <> sShow groupMemberId <> ", connId: " <> cId conn <> "] "
|
|
Just entity@(RcvFileConnection conn RcvFileTransfer {fileId}) ->
|
|
"[" <> connEntityLabel entity <> ", fileId: " <> sShow fileId <> ", connId: " <> cId conn <> "] "
|
|
Just entity@(SndFileConnection conn SndFileTransfer {fileId}) ->
|
|
"[" <> connEntityLabel entity <> ", fileId: " <> sShow fileId <> ", connId: " <> cId conn <> "] "
|
|
Just entity@(UserContactConnection conn UserContact {userContactLinkId}) ->
|
|
"[" <> connEntityLabel entity <> ", userContactLinkId: " <> sShow userContactLinkId <> ", connId: " <> cId conn <> "] "
|
|
Nothing -> ""
|
|
cId conn = sShow (connId (conn :: Connection))
|
|
where
|
|
fileNotFound fileId = ["file " <> sShow fileId <> " not found"]
|
|
sqliteError' = \case
|
|
SQLiteErrorNotADatabase -> "wrong passphrase or invalid database file"
|
|
SQLiteError e -> sShow e
|
|
|
|
viewConnectionEntityDisabled :: ConnectionEntity -> [StyledString]
|
|
viewConnectionEntityDisabled entity = case entity of
|
|
RcvDirectMsgConnection _ (Just Contact {localDisplayName = c}) -> ["[" <> entityLabel <> "] connection is disabled, to enable: " <> highlight ("/enable " <> c) <> ", to delete: " <> highlight ("/d " <> c)]
|
|
RcvGroupMsgConnection _ GroupInfo {localDisplayName = g} GroupMember {localDisplayName = m} -> ["[" <> entityLabel <> "] connection is disabled, to enable: " <> highlight ("/enable #" <> g <> " " <> m)]
|
|
_ -> ["[" <> entityLabel <> "] connection is disabled"]
|
|
where
|
|
entityLabel = connEntityLabel entity
|
|
|
|
connEntityLabel :: ConnectionEntity -> StyledString
|
|
connEntityLabel = \case
|
|
RcvDirectMsgConnection _ (Just Contact {localDisplayName = c}) -> plain c
|
|
RcvDirectMsgConnection _ Nothing -> "rcv direct msg"
|
|
RcvGroupMsgConnection _ GroupInfo {localDisplayName = g} GroupMember {localDisplayName = m} -> plain $ "#" <> g <> " " <> m
|
|
RcvFileConnection _ RcvFileTransfer {fileInvitation = FileInvitation {fileName}} -> plain $ "rcv file " <> T.pack fileName
|
|
SndFileConnection _ SndFileTransfer {fileName} -> plain $ "snd file " <> T.pack fileName
|
|
UserContactConnection _ UserContact {} -> "contact address"
|
|
|
|
ttyContact :: ContactName -> StyledString
|
|
ttyContact = styled $ colored Green
|
|
|
|
ttyContact' :: Contact -> StyledString
|
|
ttyContact' Contact {localDisplayName = c} = ttyContact c
|
|
|
|
ttyFullContact :: Contact -> StyledString
|
|
ttyFullContact Contact {localDisplayName, profile = LocalProfile {fullName}} =
|
|
ttyFullName localDisplayName fullName
|
|
|
|
ttyMember :: GroupMember -> StyledString
|
|
ttyMember GroupMember {localDisplayName} = ttyContact localDisplayName
|
|
|
|
ttyFullMember :: GroupMember -> StyledString
|
|
ttyFullMember GroupMember {localDisplayName, memberProfile = LocalProfile {fullName}} =
|
|
ttyFullName localDisplayName fullName
|
|
|
|
ttyFullName :: ContactName -> Text -> StyledString
|
|
ttyFullName c fullName = ttyContact c <> optFullName c fullName
|
|
|
|
ttyToContact :: ContactName -> StyledString
|
|
ttyToContact c = ttyTo $ "@" <> c <> " "
|
|
|
|
ttyToContact' :: Contact -> StyledString
|
|
ttyToContact' ct@Contact {localDisplayName = c} = ctIncognito ct <> ttyToContact c
|
|
|
|
ttyToContactEdited' :: Contact -> StyledString
|
|
ttyToContactEdited' ct@Contact {localDisplayName = c} = ctIncognito ct <> ttyTo ("@" <> c <> " [edited] ")
|
|
|
|
ttyQuotedContact :: Contact -> StyledString
|
|
ttyQuotedContact Contact {localDisplayName = c} = ttyFrom $ c <> ">"
|
|
|
|
ttyQuotedMember :: Maybe GroupMember -> StyledString
|
|
ttyQuotedMember (Just GroupMember {localDisplayName = c}) = "> " <> ttyFrom c
|
|
ttyQuotedMember _ = "> " <> ttyFrom "?"
|
|
|
|
ttyFromContact :: Contact -> StyledString
|
|
ttyFromContact ct@Contact {localDisplayName = c} = ctIncognito ct <> ttyFrom (c <> "> ")
|
|
|
|
ttyFromContactEdited :: Contact -> StyledString
|
|
ttyFromContactEdited ct@Contact {localDisplayName = c} = ctIncognito ct <> ttyFrom (c <> "> [edited] ")
|
|
|
|
ttyFromContactDeleted :: Contact -> Maybe Text -> StyledString
|
|
ttyFromContactDeleted ct@Contact {localDisplayName = c} deletedText_ =
|
|
ctIncognito ct <> ttyFrom (c <> "> " <> maybe "" (\t -> "[" <> t <> "] ") deletedText_)
|
|
|
|
ttyGroup :: GroupName -> StyledString
|
|
ttyGroup g = styled (colored Blue) $ "#" <> g
|
|
|
|
ttyGroup' :: GroupInfo -> StyledString
|
|
ttyGroup' = ttyGroup . groupName'
|
|
|
|
ttyGroups :: [GroupName] -> StyledString
|
|
ttyGroups [] = ""
|
|
ttyGroups [g] = ttyGroup g
|
|
ttyGroups (g : gs) = ttyGroup g <> ", " <> ttyGroups gs
|
|
|
|
ttyFullGroup :: GroupInfo -> StyledString
|
|
ttyFullGroup GroupInfo {localDisplayName = g, groupProfile = GroupProfile {fullName}} =
|
|
ttyGroup g <> optFullName g fullName
|
|
|
|
ttyFromGroup :: GroupInfo -> GroupMember -> StyledString
|
|
ttyFromGroup g m = membershipIncognito g <> ttyFrom (fromGroup_ g m)
|
|
|
|
ttyFromGroupEdited :: GroupInfo -> GroupMember -> StyledString
|
|
ttyFromGroupEdited g m = membershipIncognito g <> ttyFrom (fromGroup_ g m <> "[edited] ")
|
|
|
|
ttyFromGroupDeleted :: GroupInfo -> GroupMember -> Maybe Text -> StyledString
|
|
ttyFromGroupDeleted g m deletedText_ =
|
|
membershipIncognito g <> ttyFrom (fromGroup_ g m <> maybe "" (\t -> "[" <> t <> "] ") deletedText_)
|
|
|
|
fromGroup_ :: GroupInfo -> GroupMember -> Text
|
|
fromGroup_ GroupInfo {localDisplayName = g} GroupMember {localDisplayName = m} =
|
|
"#" <> g <> " " <> m <> "> "
|
|
|
|
ttyFrom :: Text -> StyledString
|
|
ttyFrom = styled $ colored Yellow
|
|
|
|
ttyTo :: Text -> StyledString
|
|
ttyTo = styled $ colored Cyan
|
|
|
|
ttyToGroup :: GroupInfo -> StyledString
|
|
ttyToGroup g@GroupInfo {localDisplayName = n} =
|
|
membershipIncognito g <> ttyTo ("#" <> n <> " ")
|
|
|
|
ttyToGroupEdited :: GroupInfo -> StyledString
|
|
ttyToGroupEdited g@GroupInfo {localDisplayName = n} =
|
|
membershipIncognito g <> ttyTo ("#" <> n <> " [edited] ")
|
|
|
|
ttyFilePath :: FilePath -> StyledString
|
|
ttyFilePath = plain
|
|
|
|
optFullName :: ContactName -> Text -> StyledString
|
|
optFullName localDisplayName fullName = plain $ optionalFullName localDisplayName fullName
|
|
|
|
ctIncognito :: Contact -> StyledString
|
|
ctIncognito ct = if contactConnIncognito ct then incognitoPrefix else ""
|
|
|
|
membershipIncognito :: GroupInfo -> StyledString
|
|
membershipIncognito = memIncognito . membership
|
|
|
|
memIncognito :: GroupMember -> StyledString
|
|
memIncognito m = if memberIncognito m then incognitoPrefix else ""
|
|
|
|
incognitoPrefix :: StyledString
|
|
incognitoPrefix = styleIncognito' "i "
|
|
|
|
incognitoProfile' :: Profile -> StyledString
|
|
incognitoProfile' Profile {displayName} = styleIncognito displayName
|
|
|
|
highlight :: StyledFormat a => a -> StyledString
|
|
highlight = styled $ colored Cyan
|
|
|
|
highlight' :: String -> StyledString
|
|
highlight' = highlight
|
|
|
|
styleIncognito :: StyledFormat a => a -> StyledString
|
|
styleIncognito = styled $ colored Magenta
|
|
|
|
styleIncognito' :: String -> StyledString
|
|
styleIncognito' = styleIncognito
|
|
|
|
styleTime :: String -> StyledString
|
|
styleTime = Styled [SetColor Foreground Vivid Black]
|
|
|
|
ttyError :: StyledFormat a => a -> StyledString
|
|
ttyError = styled $ colored Red
|
|
|
|
ttyError' :: String -> StyledString
|
|
ttyError' = ttyError
|