diff --git a/view/molistar/common/js/common2.js b/view/molistar/common/js/common2.js
index e3e3491e..8483da8b 100644
--- a/view/molistar/common/js/common2.js
+++ b/view/molistar/common/js/common2.js
@@ -2,13 +2,13 @@ const productUrl = 'https://api.molistar.xyz'; // 正式环境
const testUrl = 'http://beta.api.molistar.fun'; // 测试环境
-function render (templateId, templateData, target) {
+function render(templateId, templateData, target) {
var html = template(templateId, templateData);
target.innerHTML += html;
}
var tranUrl = 'https://api.molistar.xyz';
-function dateFormat (date, fmt) {
+function dateFormat(date, fmt) {
date = new Date(date);
var o = {
'M+': date.getMonth() + 1,
@@ -19,7 +19,7 @@ function dateFormat (date, fmt) {
};
// 补全0
- function padLeftZero (str) {
+ function padLeftZero(str) {
return ('00' + str).substr(str.length);
}
@@ -40,7 +40,7 @@ function dateFormat (date, fmt) {
return fmt;
}
-function convert (_url) {
+function convert(_url) {
var patt = /\d+/;
var num = _url.match(patt);
var rs = {};
@@ -65,7 +65,7 @@ function convert (_url) {
// }
// 根据域名适配环境
-function EnvCheck () {
+function EnvCheck() {
if (window.location.href) {
var _url = window.location.href;
var res = _url.match(/uat/);
@@ -84,7 +84,7 @@ function EnvCheck () {
// 根据域名判断 正式环境(含www)/测试环境(含beta), 并返回所需url前缀
// written by zxfxiong
-function getUrlPrefix () {
+function getUrlPrefix() {
if (!EnvCheck()) return undefined;
return EnvCheck() === 'live' ? productUrl : testUrl;
}
@@ -92,7 +92,7 @@ function getUrlPrefix () {
// 根据域名判断是本地打开还是服务器打开
-function locateJudge () {
+function locateJudge() {
if (window.location.href) {
var _url = window.location.href;
var res = _url.match(/test|localhost/);
@@ -105,7 +105,7 @@ function locateJudge () {
}
// 获取地址栏参数
-function getQueryString () {
+function getQueryString() {
var _url = location.search;
var theRequest = new Object();
if (_url.indexOf('?') != -1) {
@@ -119,7 +119,7 @@ function getQueryString () {
}
// 判断浏览器内核,手机类型
-function checkVersion () {
+function checkVersion() {
var u = navigator.userAgent,
app = navigator.appVersion;
return {
@@ -141,7 +141,7 @@ function checkVersion () {
}
// 图片预加载
-function preloadImage (obj) {
+function preloadImage(obj) {
console.log(obj)
var loadLength = 0,
newImages = [];
@@ -159,7 +159,7 @@ function preloadImage (obj) {
}
// 判断是否在App内
-function isApp () {
+function isApp() {
var androidBol = false;
var osBol = false;
if (window.androidJsObj && typeof window.androidJsObj === 'object') {
@@ -173,7 +173,7 @@ function isApp () {
}
-function UrlSearch () {
+function UrlSearch() {
var name, value;
var str = location.href;
var num = str.indexOf("?")
@@ -190,7 +190,7 @@ function UrlSearch () {
return value;
}
-function erbanMask (channel, tags, params) {
+function erbanMask(channel, tags, params) {
//此函数用于一般的轻寻底层面罩
var browser = checkVersion();
var env = EnvCheck();
@@ -236,7 +236,7 @@ function erbanMask (channel, tags, params) {
}
}
-function wxConfig () {
+function wxConfig() {
var wxurl = encodeURIComponent(location.href.split('#')[0]);
var data = "url=" + wxurl;
console.log(data);
@@ -266,11 +266,11 @@ function wxConfig () {
})
}
-function refreshWeb () {
+function refreshWeb() {
window.location.href = window.location.href;
}
-function shareInfo (urlMsg) {
+function shareInfo(urlMsg) {
if (urlMsg) {
var env = EnvCheck();
if (env == 'test') {
@@ -281,7 +281,7 @@ function shareInfo (urlMsg) {
}
}
-function initNav (obj) {
+function initNav(obj) {
if ($.isEmptyObject(obj)) {
return;
}
@@ -442,7 +442,7 @@ var $Loading = {
};
var requestBaseUrl = locateJudge();
// ajax
-function request (type, option) {
+function request(type, option) {
return $.ajax({
type: type,
url: requestBaseUrl + option.url,
@@ -462,11 +462,11 @@ function request (type, option) {
})
}
// ajax get
-function getJSON (option) {
+function getJSON(option) {
request('get', option)
}
// ajax post
-function postJSON (option) {
+function postJSON(option) {
request('post', option);
}
@@ -523,7 +523,7 @@ const methodsFromClient = {
// 全局获取并配置公共参数
// written by zxfxiong
const pubInfo = {};
-function getInfoFromClient () {
+function getInfoFromClient() {
const browser = checkVersion();
if (browser.app) {
console.log('从客户端获取了用户信息(设备信息),此信息来源:common2.js');
@@ -553,22 +553,88 @@ function getInfoFromClient () {
os: '0.0.0',
osVersion: '0.0.0',
channel: 'browser',
- client: 'h5'
+ client: 'h5',
};
}
};
+
+// 设定语言 fuzzy模糊查询客户端返回的语言
+const languageMap = [
+ { name: '简体中文', code: 'zh', fuzzy: ['zh', 'zh-Hans', 'zh-'] },
+ { name: '繁体中文', code: 'zh', fuzzy: ['zh', 'zh-Hant', 'zh-'] },
+ { name: '英语', code: 'en', fuzzy: ['en'] },
+ { name: '阿拉伯语', code: 'ar', fuzzy: ['ar', 'ar-'] },
+ { name: '印尼语', code: 'id', fuzzy: ['id', 'in', 'id-', 'in-'] },
+ { name: '土耳其语', code: 'tr', fuzzy: ['tr', 'tr-'] },
+];
+// 判断当前语言环境
+function getLanguageCode(language) {
+ if (language) {
+ // language = language.toLowerCase();
+ for (const item of languageMap) {
+ // if (item.fuzzy.indexOf(language) !=-1) {
+ // return item.code;
+ // }
+ for (const list of item.fuzzy) {
+ if (language.indexOf(list) != -1) {
+ return item.code;
+ }
+ }
+ }
+ } else {
+ return 'en'; // 旧版本返回默认语言
+ }
+}
+// 判断国际化参数路径
+function fuzzyMatchUpdateQueryStringParameterFun() {
+ const browser = checkVersion();
+ if (browser.app) {
+ if (browser.android) {
+ console.log('and deviceInfo', JSON.parse(pubInfo.deviceInfo));
+ let langCode = getLanguageCode(JSON.parse(pubInfo.deviceInfo)["Accept-Language"]);
+ history.replaceState(null, null, updateQueryStringParameter(window.location.href, 'lang', langCode));
+
+ } else {
+ setTimeout(function () {
+ console.log('ios deviceInfo', pubInfo.deviceInfo);
+ let langCode = getLanguageCode(pubInfo.deviceInfo["Accept-Language"]);
+ history.replaceState(null, null, updateQueryStringParameter(window.location.href, 'lang', langCode));
+ }, 40)
+ }
+ } else {
+ let langCode = getLanguageCode();
+ history.replaceState(null, null, updateQueryStringParameter(window.location.href, 'lang', langCode));
+ }
+ // 初始化国际化
+ initLocalLang();
+}
+// 获取整条url
+function updateQueryStringParameter(uri, key, value) {
+ if (!value) {
+ return uri;
+ }
+ var re = new RegExp("([?&])" + key + "=.*?(&|$)", "i");
+ var separator = uri.indexOf('?') !== -1 ? "&" : "?";
+ if (uri.match(re)) {
+ return uri.replace(re, '$1' + key + "=" + value + '$2');
+ }
+ else {
+ return uri + separator + key + "=" + value;
+ }
+}
+
// 繁体字转换方法
// fontConvert(true);//调用字体转换函数
// setTimeout(function () {
fontConvert(true);//调用字体转换函数
// }, 1000)
-function fontConvert (fontConvertBool) {
- function SconvertT () {//简体转换繁体
+function fontConvert(fontConvertBool) {
+ function SconvertT() {//简体转换繁体
document.head.innerHTML = s2t(document.head.innerHTML);
document.body.innerHTML = s2t(document.body.innerHTML);
// document.body.innerHTML
}
- function TconvertS () {//繁体转换简体
+ function TconvertS() {//繁体转换简体
document.head.innerHTML = t2s(document.head.innerHTML);
document.body.innerHTML = t2s(document.body.innerHTML);
}
@@ -579,7 +645,7 @@ function fontConvert (fontConvertBool) {
}
//功能:转换对象,使用递归,逐层剥到文本;
- function transformContent (switcherId, fobj) {
+ function transformContent(switcherId, fobj) {
if (typeof (fobj) == "object") {
var obj = fobj.childNodes
} else {
@@ -613,12 +679,12 @@ function fontConvert (fontConvertBool) {
}
}
//功能:转换指定字符串;
- function transformText (txt, isFt) {
+ function transformText(txt, isFt) {
if (txt == null || txt == "") return ""
if (parseInt(isFt)) { return s2t(txt) } else { return t2s(txt) }
}
//功能:简体字符转为繁体字符;
- function s2t (cc) {
+ function s2t(cc) {
var str = '', ss = jtpy(), tt = ftpy();
for (var i = 0; i < cc.length; i++) {
var c = cc.charAt(i);
@@ -628,7 +694,7 @@ function fontConvert (fontConvertBool) {
return str;
}
//功能:繁体字符转为简体字符;
- function t2s (cc) {
+ function t2s(cc) {
var str = '', ss = jtpy(), tt = ftpy();
for (var i = 0; i < cc.length; i++) {
var c = cc.charAt(i);
@@ -637,14 +703,14 @@ function fontConvert (fontConvertBool) {
}
return str;
}
- function jtpy () {
+ function jtpy() {
return '号隐爱的魔力之旅週金币榜皑蔼碍翱袄奥坝罢摆败颁办绊帮绑镑谤剥饱宝报鲍辈贝钡狈备惫绷笔毕毙闭边编贬变辩辫鼈瘪濒滨宾摈饼拨钵铂驳卜补参蚕残惭惨灿苍舱仓沧厕侧册测层诧搀掺蝉馋谗缠铲産阐颤场尝长偿肠厂畅钞车彻尘陈衬撑称惩诚骋痴迟驰耻齿炽冲虫宠畴踌筹绸丑橱厨锄雏础储触处传疮闯创锤纯绰辞词赐聪葱囱从丛凑窜错达带贷担单郸掸胆惮诞弹当挡党荡档捣岛祷导盗灯邓敌涤递缔点垫电淀钓调迭谍迭钉顶锭订东动栋冻斗犊独读赌镀锻断缎兑队对吨顿钝夺鹅额讹恶饿儿尔饵贰发罚阀珐矾钒烦范贩饭访纺飞废费纷坟奋愤粪丰枫锋风疯冯缝讽凤肤辐抚辅赋複负讣妇缚该钙盖干赶秆赣冈刚钢纲岗皋镐搁鸽阁铬个给龚宫巩贡鈎沟构购够蛊顾剐关观馆惯贯广规硅归龟闺轨诡柜贵刽辊滚锅国过骇韩汉阂鹤贺横轰鸿红后壶护沪户哗华画划话怀坏欢环还缓换唤痪焕涣黄谎挥辉毁贿秽会烩彙讳诲绘荤浑伙获货祸击机积饥讥鸡绩缉极辑级挤几蓟剂济计记际继纪夹荚颊贾钾价驾歼监坚笺间艰缄茧检碱硷拣捡简俭减荐槛鉴践贱见键舰剑饯渐溅涧浆蒋桨奖讲酱胶浇骄娇搅铰矫侥脚饺缴绞轿较秸阶节茎惊经颈静镜径痉竞淨纠厩旧驹举据锯惧剧鹃绢杰洁结诫届紧锦仅谨进晋烬尽劲荆觉决诀绝钧军骏开凯颗壳课垦恳抠库裤夸块侩宽矿旷况亏岿窥馈溃扩阔蜡腊莱来赖蓝栏拦篮阑兰澜谰揽览懒缆烂滥捞劳涝乐镭垒类泪篱离里鲤礼丽厉励砾曆沥隶俩联莲连镰怜涟帘敛脸链恋炼练粮凉两辆谅疗辽镣猎临邻鳞凛赁龄铃凌灵岭领馏刘龙聋咙笼垄拢陇楼娄搂篓芦卢颅庐炉掳卤虏鲁赂禄录陆驴吕铝侣屡缕虑滤绿峦挛孪滦乱抡轮伦仑沦纶论萝罗逻锣箩骡骆络妈玛码蚂马骂吗买麦卖迈脉瞒馒蛮满谩猫锚铆贸么霉没镁门闷们锰梦谜弥觅绵缅庙灭悯闽鸣铭谬谋亩钠纳难挠脑恼闹馁腻撵捻酿鸟聂齧镊镍柠狞甯拧泞钮纽脓浓农疟诺欧鸥殴呕沤盘庞国爱赔喷鹏骗飘频贫苹凭评泼颇扑铺朴谱脐齐骑岂啓气弃讫牵扦釺铅迁签谦钱钳潜浅谴堑枪呛牆蔷强抢锹桥乔侨翘窍窃钦亲轻氢倾顷请庆琼穷趋区躯驱龋颧权劝却鹊让饶扰绕热韧认纫荣绒软锐闰润洒萨鳃赛伞丧骚扫涩杀纱筛晒闪陝赡缮伤赏烧绍赊摄慑设绅审婶肾渗声绳胜圣师狮湿诗尸时蚀实识驶势释饰视试寿兽枢输书赎属术树竖数帅双谁税顺说硕烁丝饲耸怂颂讼诵擞苏诉肃虽绥岁孙损笋缩琐锁獭挞抬摊贪瘫滩坛谭谈歎汤烫涛縧腾誊锑题体屉条贴铁厅听烃铜统头图涂团颓蜕脱鸵驮驼椭洼袜弯湾顽万网韦违围爲潍维苇伟僞纬谓卫温闻纹稳问瓮挝蜗涡窝呜钨乌诬无芜吴坞雾务误锡牺袭习铣戏细虾辖峡侠狭厦锨鲜纤咸贤衔闲显险现献县馅羡宪线厢镶乡详响项萧销晓啸蝎协挟携胁谐写泻谢锌衅兴汹鏽绣虚嘘须许绪续轩悬选癣绚学勳询寻驯训讯逊压鸦鸭哑亚讶阉烟盐严顔阎豔厌砚彦谚验鸯杨扬疡阳痒养样瑶摇尧遥窑谣药爷页业叶医铱颐遗仪彝蚁艺亿忆义诣议谊译异绎荫阴银饮樱婴鹰应缨莹萤营荧蝇颖哟拥佣痈踊咏涌优忧邮铀犹游诱舆鱼渔娱与屿语吁御狱誉预驭鸳渊辕园员圆缘远愿约跃钥岳粤悦阅云郧匀陨运蕴酝晕韵杂灾载攒暂赞赃髒凿枣灶责择则泽贼赠扎札轧铡闸诈斋债毡盏斩辗崭栈战绽张涨帐账胀赵蛰辙锗这贞针侦诊镇阵挣睁狰帧郑证织职执纸挚掷帜质锺终种肿衆诌轴皱昼骤猪诸诛烛瞩嘱贮铸筑驻专砖转赚桩庄装妆壮状锥赘坠缀谆浊兹资渍踪综总纵邹诅组鑽緻钟么为隻凶准启闆裡雳馀鍊洩并';
}
- function ftpy () {
+ function ftpy() {
return '號隱愛的魔力之旅週金幣榜皚藹礙翺襖奧壩罷擺敗頒辦絆幫綁鎊謗剝飽寶報鮑輩貝鋇狽備憊繃筆畢斃閉邊編貶變辯辮鼈癟瀕濱賓擯餅撥缽鉑駁蔔補參蠶殘慚慘燦蒼艙倉滄廁側冊測層詫攙摻蟬饞讒纏鏟産闡顫場嘗長償腸廠暢鈔車徹塵陳襯撐稱懲誠騁癡遲馳恥齒熾沖蟲寵疇躊籌綢醜櫥廚鋤雛礎儲觸處傳瘡闖創錘純綽辭詞賜聰蔥囪從叢湊竄錯達帶貸擔單鄲撣膽憚誕彈當擋黨蕩檔搗島禱導盜燈鄧敵滌遞締點墊電澱釣調疊諜疊釘頂錠訂東動棟凍鬥犢獨讀賭鍍鍛斷緞兌隊對噸頓鈍奪鵝額訛惡餓兒爾餌貳發罰閥琺礬釩煩範販飯訪紡飛廢費紛墳奮憤糞豐楓鋒風瘋馮縫諷鳳膚輻撫輔賦複負訃婦縛該鈣蓋幹趕稈贛岡剛鋼綱崗臯鎬擱鴿閣鉻個給龔宮鞏貢鈎溝構購夠蠱顧剮關觀館慣貫廣規矽歸龜閨軌詭櫃貴劊輥滾鍋國過駭韓漢閡鶴賀橫轟鴻紅後壺護滬戶嘩華畫劃話懷壞歡環還緩換喚瘓煥渙黃謊揮輝毀賄穢會燴彙諱誨繪葷渾夥獲貨禍擊機積饑譏雞績緝極輯級擠幾薊劑濟計記際繼紀夾莢頰賈鉀價駕殲監堅箋間艱緘繭檢堿鹼揀撿簡儉減薦檻鑒踐賤見鍵艦劍餞漸濺澗漿蔣槳獎講醬膠澆驕嬌攪鉸矯僥腳餃繳絞轎較稭階節莖驚經頸靜鏡徑痙競淨糾廄舊駒舉據鋸懼劇鵑絹傑潔結誡屆緊錦僅謹進晉燼盡勁荊覺決訣絕鈞軍駿開凱顆殼課墾懇摳庫褲誇塊儈寬礦曠況虧巋窺饋潰擴闊蠟臘萊來賴藍欄攔籃闌蘭瀾讕攬覽懶纜爛濫撈勞澇樂鐳壘類淚籬離裏鯉禮麗厲勵礫曆瀝隸倆聯蓮連鐮憐漣簾斂臉鏈戀煉練糧涼兩輛諒療遼鐐獵臨鄰鱗凜賃齡鈴淩靈嶺領餾劉龍聾嚨籠壟攏隴樓婁摟簍蘆盧顱廬爐擄鹵虜魯賂祿錄陸驢呂鋁侶屢縷慮濾綠巒攣孿灤亂掄輪倫侖淪綸論蘿羅邏鑼籮騾駱絡媽瑪碼螞馬罵嗎買麥賣邁脈瞞饅蠻滿謾貓錨鉚貿麼黴沒鎂門悶們錳夢謎彌覓綿緬廟滅憫閩鳴銘謬謀畝鈉納難撓腦惱鬧餒膩攆撚釀鳥聶齧鑷鎳檸獰寧擰濘鈕紐膿濃農瘧諾歐鷗毆嘔漚盤龐國愛賠噴鵬騙飄頻貧蘋憑評潑頗撲鋪樸譜臍齊騎豈啓氣棄訖牽扡釺鉛遷簽謙錢鉗潛淺譴塹槍嗆牆薔強搶鍬橋喬僑翹竅竊欽親輕氫傾頃請慶瓊窮趨區軀驅齲顴權勸卻鵲讓饒擾繞熱韌認紉榮絨軟銳閏潤灑薩鰓賽傘喪騷掃澀殺紗篩曬閃陝贍繕傷賞燒紹賒攝懾設紳審嬸腎滲聲繩勝聖師獅濕詩屍時蝕實識駛勢釋飾視試壽獸樞輸書贖屬術樹豎數帥雙誰稅順說碩爍絲飼聳慫頌訟誦擻蘇訴肅雖綏歲孫損筍縮瑣鎖獺撻擡攤貪癱灘壇譚談歎湯燙濤縧騰謄銻題體屜條貼鐵廳聽烴銅統頭圖塗團頹蛻脫鴕馱駝橢窪襪彎灣頑萬網韋違圍爲濰維葦偉僞緯謂衛溫聞紋穩問甕撾蝸渦窩嗚鎢烏誣無蕪吳塢霧務誤錫犧襲習銑戲細蝦轄峽俠狹廈鍁鮮纖鹹賢銜閑顯險現獻縣餡羨憲線廂鑲鄉詳響項蕭銷曉嘯蠍協挾攜脅諧寫瀉謝鋅釁興洶鏽繡虛噓須許緒續軒懸選癬絢學勳詢尋馴訓訊遜壓鴉鴨啞亞訝閹煙鹽嚴顔閻豔厭硯彥諺驗鴦楊揚瘍陽癢養樣瑤搖堯遙窯謠藥爺頁業葉醫銥頤遺儀彜蟻藝億憶義詣議誼譯異繹蔭陰銀飲櫻嬰鷹應纓瑩螢營熒蠅穎喲擁傭癰踴詠湧優憂郵鈾猶遊誘輿魚漁娛與嶼語籲禦獄譽預馭鴛淵轅園員圓緣遠願約躍鑰嶽粵悅閱雲鄖勻隕運蘊醞暈韻雜災載攢暫贊贓髒鑿棗竈責擇則澤賊贈紮劄軋鍘閘詐齋債氈盞斬輾嶄棧戰綻張漲帳賬脹趙蟄轍鍺這貞針偵診鎮陣掙睜猙幀鄭證織職執紙摯擲幟質鍾終種腫衆謅軸皺晝驟豬諸誅燭矚囑貯鑄築駐專磚轉賺樁莊裝妝壯狀錐贅墜綴諄濁茲資漬蹤綜總縱鄒詛組鑽緻鐘麼為隻兇準啟闆裡靂餘鍊洩並';
}
//功能:获取指定名称的 Cookie 值;
- function readCookie (name) {
+ function readCookie(name) {
var value = "";
if (document.cookie.length > 0) {
var prefix = name + "=";
@@ -659,7 +725,7 @@ function fontConvert (fontConvertBool) {
return value;
}
//功能:设置指定名称的 Cookie 值;
- function writeCookie (name, value, days) {
+ function writeCookie(name, value, days) {
var argv = writeCookie.arguments;
var argc = writeCookie.arguments.length;
var days = (argc > 2) ? argv[2] : null;
@@ -676,7 +742,7 @@ function fontConvert (fontConvertBool) {
// isDefaultFt 当前文档默认是否为繁体中文;
// delay 页面加载后的转换延迟时间,单位毫秒;
// 使用的 Cookie 变量名称:isCurrentFt
- function initPageLanguage (switcherId, isDefaultFt, delay) {
+ function initPageLanguage(switcherId, isDefaultFt, delay) {
isDefaultFt = isDefaultFt ? "1" : "0";
var switcherObj = document.getElementById(switcherId)
isCurrentFt = readCookie("isCurrentFt")
@@ -702,17 +768,17 @@ function fontConvert (fontConvertBool) {
//initPageLanguage("switcher_link", false, 50);
}
// 封装数值超过最大数位处理单位
-function unitProcessing (val, num, toFixeds, text) { //值 以什么为单位 保留几位小数 单位后最w
+function unitProcessing(val, num, toFixeds, text) { //值 以什么为单位 保留几位小数 单位后最w
return val >= num ? (Math.floor(val / 1000) / 10).toFixed(toFixeds) + text : val;
}
// 封装 在ios环境中 配置公共参数的回调函数
// 配合 methodsFromClient[infoName].ios 方法
// written by zxfxiong
-function getMessage (key, value) {
+function getMessage(key, value) {
pubInfo[key] = value;
}
-function objToParam (a) {
+function objToParam(a) {
var s = [],
rbracket = /\[\]$/,
isArray = function (obj) {
@@ -758,7 +824,7 @@ function objToParam (a) {
// 封装 jquery 请求
// written by zxfxiong
-function networkRequest (reqObj = {}, type) {
+function networkRequest(reqObj = {}, type) {
// 关于reqObj内部参数:与 调用原生$.ajax()时传参一致
// 调用该函数前:须保证事先调用了 getInfoFromClient()
if (typeof pubInfo.deviceInfo === 'string') {
@@ -776,7 +842,7 @@ function networkRequest (reqObj = {}, type) {
if (browser.app) {
pubHeader.pub_ticket = pubInfo.ticket
} else {
- pubHeader.h5_token =sessionStorage.getItem("ticket") ? sessionStorage.getItem("ticket") : '';
+ pubHeader.h5_token = sessionStorage.getItem("ticket") ? sessionStorage.getItem("ticket") : '';
}
const url = reqObj.url;
const commParams = objToParam(pubHeader);
@@ -795,7 +861,7 @@ function networkRequest (reqObj = {}, type) {
return response;
}
// 控制body是否可以滑动
-function bodyScroolFun (bool) {
+function bodyScroolFun(bool) {
if (bool) {
$('body').css('overflow', 'hidden');
} else {
diff --git a/view/molistar/common/local/langHandler.js b/view/molistar/common/local/langHandler.js
new file mode 100644
index 00000000..33650837
--- /dev/null
+++ b/view/molistar/common/local/langHandler.js
@@ -0,0 +1,55 @@
+/**
+ * 初始化当前语言
+ */
+function initLocalLang () {
+ const lang = localStorage.getItem('lang')
+ // if (lang === 'zh' || window.location.href.match('=zh-CN')) {
+ // console.log("langHandler" + '简体')
+ // // 将 zh-CN.js中的对象langZhCN设置到window.lang中
+ // window.lang = langZh-CN
+ // window.lang.code = 'zh-CN'
+ // window.lang.defaults = false
+ // } else
+ if (lang === 'zh' || window.location.href.match('=zh')) {
+ console.log("langHandler" + '繁体')
+ window.lang = langZh
+ window.lang.code = 'zh'
+ window.lang.defaults = false
+ } else if (lang === 'ar' || window.location.href.match('=ar')) {
+ // 阿拉伯
+ console.log("langHandler" + '阿拉伯')
+ window.lang = langAr
+ window.lang.code = 'ar'
+ window.lang.defaults = false
+ } else if (lang === 'en' || window.location.href.match('=en')) {
+ // 英语
+ console.log("langHandler" + '英语')
+ window.lang = langEn
+ window.lang.code = 'en'
+ window.lang.defaults = false
+ } else if (lang === 'id' || window.location.href.match('=id')) {
+ // 印度尼西亚
+ console.log("langHandler" + '印尼')
+ window.lang = langId
+ window.lang.code = 'id'
+ window.lang.defaults = false
+ }else if (lang === 'tr' || window.location.href.match('=tr')) {
+ // 土耳其
+ console.log("langHandler" + '土耳其')
+ window.lang = langTr
+ window.lang.code = 'tr'
+ window.lang.defaults = false
+ } else {
+ console.log("langHandler" + '默认英语')
+ window.lang = langEn
+ window.lang.code = null
+ window.lang.defaults = true
+ }
+
+ window.lang.replace = (Lang, defaultText) => {
+ if (Lang) {
+ return Lang
+ }
+ return defaultText
+ }
+}
\ No newline at end of file
diff --git a/view/molistar/modules/rule/community-norms.html b/view/molistar/modules/rule/community-norms.html
index 4734e01c..56ef4877 100644
--- a/view/molistar/modules/rule/community-norms.html
+++ b/view/molistar/modules/rule/community-norms.html
@@ -5,7 +5,7 @@
-
MolistarApp Community Guidelines
+ MolistarApp Community Guidelines
-
- Principles
+
- 1. In order to maintain a healthy ecosystem on the MolistarApp platform, promote green live streaming, better
- safeguard the legitimate rights and interests of users, and ensure a good user experience, Wuhan Donglin Information
- Technology Co., Ltd. has formulated these "MolistarApp Community Guidelines" in accordance with the current relevant
- laws and regulations such as the "Regulations on Ecological Governance of Internet Information Content",
- "Administrative Measures for Internet Information Services", "Regulations on the Administration of Internet Live
- Streaming Services", "Regulations on the Management of Internet Comments", "Regulations on the Administration of
- Internet Forum Community Services", as well as the "MolistarApp User Registration Service Agreement".
-
- 2. All activities of MolistarApp users on the MolistarApp platform must comply with the current laws and
- regulations. Their behaviors and speech must not violate relevant laws and regulations. Otherwise, MolistarApp
- company will take corresponding measures against violations in accordance with relevant laws and regulations and
- user agreement rules, and will resolutely prohibit the spread of harmful information and remove illegal content.
-
- 3. If users have any doubts or disputes about the interpretation and implementation of these guidelines, they can
- inform us, and we will interpret or handle them according to the relevant rules.
-
- Community Guidelines
-
- Encouraged Activities
-
- MolistarApp platform encourages MolistarApp users to create, replicate, and publish information containing the
- following content:
-
- 1. Promote Xi Jinping Thought on Socialism with Chinese Characteristics for a New Era, comprehensively, accurately,
- and vividly interpret the path, theory, system, and culture of socialism with Chinese characteristics.
-
- 2. Promote the party's theoretical line, principles, and policies, as well as major decisions and deployments of the
- central government.
-
- 3. Showcase highlights of economic and social development, reflecting the great struggles and vibrant lives of the
- people.
-
- 4. Promote the core socialist values, disseminate excellent moral culture and the spirit of the times, and fully
- display the spirited demeanor of the Chinese nation.
-
- 5. Effectively respond to social concerns, clarify doubts, analyze matters, and help guide the formation of
- consensus among the masses.
-
- 6. Contribute to increasing the international influence of Chinese culture and presenting a true, three-dimensional,
- and comprehensive China to the world.
-
- 7. Other content that emphasizes taste, style, responsibility, praises truth, goodness, beauty, and promotes unity
- and stability.
-
- Prohibited Activities
-
- MolistarApp users are prohibited from creating, replicating, or publishing prohibited content, including but not
- limited to the following information. The platform will warn, mute, ban, or device-ban users who violate these
- rules:
-
- (1) Content Prohibited by Laws and Regulations
-
- 1. Opposing the fundamental principles established in the Constitution.
-
- 2. Endangering national security, leaking state secrets, subverting state power, or undermining national unity.
-
- 3. Harming the national honor and interests.
-
- 4. Advocating terrorism, extremism, or inciting terrorist activities or extremist activities.
-
- 5. Inciting ethnic hatred or discrimination, and undermining ethnic unity.
-
- 6. Violating the state's religious policies, promoting cults, and feudal superstitions.
-
- 7. Spreading rumors and disrupting economic and social order.
-
- 6. Inciting discrimination, regional discrimination, etc.
-
- 7. Promoting vulgar, vulgar, and tacky content.
-
- 8. Likely to cause minors to imitate unsafe behaviors, violate social morality, induce minors' bad habits, etc.
-
- 9. Other content that adversely affects the network ecology.
-
- (7) Violations of Minors' Legal Rights and Interests
-
- 1. Posting content that affects minors' establishment of correct values.
-
- 2. Spreading harmful information to underage users.
-
- 3. Inducing minors to engage in illegal and bad behaviors.
-
- 4. Instigating and inducing minors to reward.
-
- 5. Other actions that infringe on the legitimate rights and interests of minors.
-
- (8) Complaint Reporting
-
- 1. The platform strictly prohibits poaching within guilds. If verified through a report, account bans will be
- implemented. Serious cases will result in punishment for the guild concerned.
-
- 2. If a user is reported or complained about, once verified, depending on the severity of the case, the reported
- individual may receive warnings, account bans, etc.
-
- 3. Users who maliciously report individuals, guilds, etc., without violating community guidelines, once verified,
- depending on the severity of the case, will receive warnings, mutes, or account bans.
-
- 4. Users who use inappropriate methods against competitors, guilds, etc., such as organizing instigators to
- maliciously insult, spread rumors; depending on the severity of the case, warnings, mutes, or account bans will be
- applied.
-
- 5. Users who are banned for inappropriate comments, the duration of the ban will increase with each offense.
-
- 6. Users who repeatedly maliciously report or complain about the platform will be warned, muted, banned, or
- device-banned.
-
- 7. All MolistarApp users are requested to abide by the platform's community guidelines. At the same time, everyone
- is welcome to supervise together and report violations promptly through the platform's complaint channel.
-
- Broadcasters are obliged to ensure a healthy and orderly community environment for the application. Broadcasters are
- responsible for all content in audio and video, including guests and live information. If the above parts contain
- violations, MolistarApp platform officials have the right to punish the violators and broadcasters together.
-
- These community guidelines are dynamic documents, and we have the right to modify their content according to
- relevant laws, regulations, policy supervision, or the needs of product/service operation and update them
- irregularly for public display. The latest updated document shall prevail. The various provisions of these
- guidelines are based on the basic principles of compliance with national laws, regulations, and policies. In case of
- inconsistency, the provisions of national laws, regulations, and policies shall prevail.
-
- These guidelines take effect and are implemented from the date of publication and apply to all users of the
- MolistarApp platform. User use of MolistarApp platform services is deemed as acceptance of these guidelines, which
- are legally binding on users.
-
- These guidelines are an integral part of the "MolistarApp User Registration Service Agreement". In case of any
- matters not covered by these guidelines, relevant provisions of the "MolistarApp Software License Service Agreement"
- shall apply.
-
- Complaints can be sent to molistar666@gmail.com.
+
+
+
+
+
\ No newline at end of file
diff --git a/view/molistar/modules/rule/guide.html b/view/molistar/modules/rule/guide.html
index f040bdf8..bf1ba2fc 100644
--- a/view/molistar/modules/rule/guide.html
+++ b/view/molistar/modules/rule/guide.html
@@ -11,23 +11,37 @@
- Help
+ Help
-
-
-
-
-
+
+
+
+
+
+
+
+
+
+
\ No newline at end of file
diff --git a/view/molistar/modules/rule/live-protocol.html b/view/molistar/modules/rule/live-protocol.html
index f31c30c1..cc70b3d6 100644
--- a/view/molistar/modules/rule/live-protocol.html
+++ b/view/molistar/modules/rule/live-protocol.html
@@ -8,7 +8,7 @@
- User live broadcast protocol
+ User live broadcast protocol
-
-
- Unless you have read and accepted all the terms of this agreement, you are not entitled to conduct live
- broadcasts or enjoy related services.
-
- Before you apply to become a network voice broadcaster (referred to as "broadcaster") on the platform and
- provide online live broadcast services to platform users according to the application requirements and rules,
- please carefully read and fully understand the following terms, especially the clauses regarding limitations,
- exclusions, or exemptions from liability, which may be highlighted in bold for your attention.
-
- This Live Broadcasting Service Agreement (hereinafter referred to as "this Agreement") stipulates the rights and
- obligations between Guangzhou Time Online Network Technology Co., Ltd. and its affiliated companies (referred to
- as "") and the broadcaster (referred to as "you") regarding the provision of voice broadcasting services by the
- platform. Please read this agreement carefully before conducting voice broadcasts to ensure that you fully
- understand the content of each clause in this agreement. Unless you accept all the terms of this agreement, you
- are not entitled to use the services covered by this agreement. Your behavior of conducting voice broadcasts
- will be deemed as acceptance of this agreement and agreement to be bound by the terms of this agreement.
-
- Article 1 General Provisions
-
- 1. Molistar provides you with platform broadcaster voice broadcasting services. After you agree to this
- agreement, you can use the above services to perform and share online interactions. However, Molistar only
- serves as a neutral internet live broadcast platform, only providing you with neutral technical support services
- such as voice broadcasting services, and is not responsible for or able to pre-screen the content of real-time
- online voice broadcasts provided by you to platform users. It also does not actively edit, organize, modify, or
- process live content.
-
- 2. In accordance with this agreement and the platform rules, you apply to become a broadcaster on the Molistar
- platform, provide online voice broadcasting services to Molistar platform users, and interact with users. The
- period during which you provide services on the Molistar platform shall be deemed as the term of the agreement.
- Molistar conducts formal reviews of the content produced, edited, and produced by you (including but not limited
- to pictures, posters, avatars, audio, etc.), but you still need to bear the corresponding legal responsibilities
- for the authenticity, legality, accuracy, timeliness, etc. of the above content.
-
- 3. During the registration or use of this service, you need to fill in or submit some necessary information and
- materials for Molistar's review. If the information you submit is incomplete or does not comply with legal
- regulations or Molistar's regulations, you may not be able to successfully register or may be restricted during
- the use of this service. If there are changes to your personal information or contact information, you must
- update Molistar promptly.
-
- 4. Molistar only provides you with a network platform for online interactive live broadcasting, and your
- relationship with Molistar does not constitute any employment, labor, or service legal relationship.
-
- 5. You promise and declare that when providing internet live broadcasting services to platform users, you will
- strictly comply with relevant laws, regulations, rules, policies, public order, good customs, Molistar's
- relevant service agreements, platform code of conduct, and management regulations, and shall not engage in any
- behavior that violates the laws, regulations, rules, policies, or public order and good customs of China and
- other countries or regions in the name of performing this agreement.
-
- 6. You promise and declare that when providing internet live broadcasting services to platform users, you will
- strictly comply with relevant laws, regulations, rules, policies, public order, good customs, relevant service
- agreements, platform code of conduct, and management regulations, and shall not engage in any behavior that
- violates the laws, regulations, rules, policies, or public order and good customs of China and other countries
- or regions in the name of performing this agreement.
-
- Article 2 Service Rules
-
- 1. Molistar has the right to formulate operational systems and management rules for broadcasters, and has the
- right to revise and change agreements, rules, and codes of conduct on the platform (such as Internet websites,
- mobile networks) regularly or irregularly. It has the right to manage and supervise you, and you understand and
- agree to this.
-
- 2. According to your application or the rules announced by the platform, Molistar has the right to entrust the
- management of broadcasters to your studio, agent company, or other third-party organizations commissioned by
- your studio or agent company (hereinafter referred to as "guild").
-
- 3. Molistar has the right to assess and evaluate you according to the platform rules (assessment and evaluation
- criteria include but are not limited to the length of live broadcasting time, the number of viewers, the
- quantity and types of virtual gifts given by users, user support, user complaint situations, violations of laws
- and regulations, etc.) to determine your virtual props and income, impose bans, delete relevant content,
- temporarily ban/close rooms, specific inspection items and standards are formulated separately, and your consent
- is not required separately; if you violate laws, regulations, or platform rules and norms during the live
- broadcast, punishment measures may be taken (including but not limited to deduction of virtual props and income,
- temporary bans, deletion of relevant content, temporary bans/closure of rooms, or directly suspending your
- account). If you wish to engage in in-depth cooperation on personal live broadcasting matters, a separate
- broadcaster cooperation agreement may be signed after friendly negotiation between the two parties.
-
- 4. Molistar has the right to provide improvement suggestions and opinions on the live broadcasting services you
- provide on the platform. You should make corresponding adjustments within 3 days after receiving the suggestions
- or opinions. If you fail to make timely adjustments and violate this agreement or relevant rules, or violate
- rules or laws, Molistar has the right to take punitive measures (including but not limited to deduction of
- virtual props and income, bans, deletion of relevant content, temporary bans/closure of rooms, or directly
- suspending your account).
-
- 5. Molistar has the right to review the legality of your voice broadcast content (including but not limited to
- pictures, posters, avatars, audio, etc.) in accordance with legal regulations or requirements of relevant
- departments. If there is any illegal, irregular, infringing, or infringing on the legitimate rights and
- interests of third parties in the voice broadcast content, Molistar has the right to take measures such as
- suspending broadcasting, deleting content, canceling accounts, and cooperating with competent authorities for
- investigation.
-
- 6. Molistar has the right to mark watermarks with LOGO (or names) and time in your live broadcast room, and you
- need to make corresponding adjustments based on the live broadcast effect.
-
- 7. Molistar is responsible for providing you with a platform for voice broadcasting and providing technical
- support services for the platform. However, it does not guarantee that the network service will necessarily meet
- all your requirements, does not guarantee that the network service will always be smooth, and does not guarantee
- the timeliness, security, and accuracy of the network service.
-
- 8. Contact you or send relevant notices through platform announcements, platform message push, mobile phone text
- messages, or regular letters. Such notices shall be deemed as delivered on the date of sending.
-
- 9. Due to the particularity of voice broadcasting services, you agree that Molistar has the right to change,
- interrupt, or terminate part or all of the voice broadcasting services at any time. If any loss is caused by
- changes, interruptions, or terminations of voice broadcasting services, Molistar shall not be liable to you or
- any third party, but shall endeavor to notify you in advance by means of announcements, emails, or system pop
-
- -ups before changing, interrupting, or terminating the services, and the date of notification shall be deemed as
- the completion of delivery.
-
- Article 3 Rules of Use
-
- 1. You undertake not to harm the legitimate interests of third parties in performing this agreement (including
- but not limited to rights of reputation, privacy, portrait rights, etc., intellectual property rights such as
- copyright) or violate Chinese laws, regulations, normative documents, policies, public order, good customs,
- socialist morality, etc. You agree and undertake that the performance of this agreement does not violate any
- legally binding documents on you, nor will it cause any third party to assume any responsibility.
-
- 2. You fully understand the rules and requirements, guarantee the conditions, capabilities, and qualifications
- to fulfill the duties and obligations stipulated in this agreement as a broadcaster, carry out Internet live
- broadcasting activities, and comply with and fulfill the legal obligations stipulated in this agreement.
-
- 3. You understand and agree that all income generated based on the platform is ultimately based on backend data;
- at the same time, you must comply with various platform operating systems and requirements updated from time to
- time, as well as national laws, regulations, normative documents, etc., regarding such Internet services.
-
- 4. You agree to grant irrevocable free use of your name (including but not limited to your real name, pen name,
- username, former name, and any symbols representing your identity) and image (including but not limited to real
- portraits and cartoon portraits, etc.) for various promotional and publicity purposes related to associated
- companies globally, and provide necessary cooperation.
-
- 5. You warrant that you own or have legal usage rights to all content uploaded by you, including images,
- posters, avatars, live content, etc., have legal intellectual property rights and related rights, and have the
- right to upload and authorize usage. You acknowledge that if you engage in any improper behavior during the use
- of voice broadcasting services, violate laws, regulations, policies, etc., or infringe on the legitimate rights
- and interests of third parties, you shall bear corresponding responsibilities, without any liability on the
- platform. If damage is caused by your actions, you should compensate, and have the right to deduct the
- compensation directly from your share of the proceeds.
-
- 6. You shall bear the conditions and expenses (including but not limited to telephone and internet fees for
- accessing the internet, mobile phone fees for using mobile networks) required for voice broadcasting, and ensure
- the clear and stable quality of live voice. If live broadcast is interrupted or cannot be viewed due to network
- issues on your end, you have the right to request an upgrade of the network. You should make corresponding
- corrections within 3 days after receiving the suggestions or opinions, otherwise, you have the right to take
- corresponding punitive measures.
-
- 7. The live broadcasting service and all information, speeches, and content published by you on the platform
- must not involve politics, guns, drugs, violence, pornography, or other content that violates Chinese laws,
- regulations, normative documents, policies, public order, good customs, socialist morality, etc., including but
- not limited to: endangering national security; anti-party, anti-government, or insulting remarks against the
- party and the state; spreading rumors; illegal activities; obscene content; false, misleading, inducing, or
- defrauding others; gambling; defamation (including commercial defamation); threats or harassment of others;
- infringement of others' intellectual property rights, personal rights, trade secrets, or other legal rights;
- threatening life and health, or using firearms, knives for performance; posting illegal advertisements, junk
- information; and any content or links that violate social order, public morality, or social ethics.
-
- 8. You must provide true, accurate, and legally valid personal identity information and contact information to
- complete real-name authentication; if you are a natural person, you should submit true and valid name, contact
- phone number (mobile phone), ID card number, etc., and undergo facial recognition and other authentication
- registrations; if you are a legal person or other organization, you should provide true and valid name, address,
- contact person, etc., and undergo business license, organizational structure code, and other real-name
- authentication registrations. If there are changes to personal information or contact information, you must
- update them promptly.
-
- 9. You undertake to abide by the principle of honesty and credit, not disturb the normal order of the platform,
- promise that live broadcast rooms must be used for personal broadcasting or other business purposes added
- according to the development needs of the platform, and may not be used for any other non-personal broadcasting
- nature or other activities not allowed by the platform, without consent, not publish commercial advertisements,
- not engage in activities unrelated to online live performances.
-
- 10. The account and password registered by you are the only identity credentials for you to accept platform
- services, which you are solely responsible for keeping and setting passwords, and it is prohibited to gift,
- borrow, rent, transfer, or sell them. You shall bear all legal responsibilities for all activities and events
- carried out under your account.
-
- 11. You undertake that the above information, including but not limited to various accounts used, third-party
- payment accounts, and corresponding passwords, shall not be disclosed during the process of live broadcasting or
- using other platform services, nor shall you publish, upload, or provide to others any information involving
- your privacy through platform services, otherwise, you shall bear the responsibility and loss arising therefrom.
-
- 12. You undertake to actively maintain the image of the platform, guarantee not to engage in any behavior
- detrimental to the image and brand, otherwise, the agreement may be terminated, and you may be required to bear
- all compensation liability.
-
- 13. During the term of this agreement and after the termination of this agreement, you shall not spread or
- disseminate through any means or channels (including but not limited to newspapers, media, self-media, websites,
- blogs, Facebook, LINE chat groups, peer gatherings, etc.) any remarks, images, etc., that damage reputation and
- image, nor shall you spread any false information through any means, nor shall you imply or publish any speech
- unfavorable to the platform. In any way, or platform, otherwise, you have the right to claim compensation
- (including but not limited to deducting virtual props and income, and even directly suspending your account).
-
- 14. If there are third-party participants in your live broadcast content, you shall ensure that there are no
- legal disputes with third parties. If there are such disputes, you shall be solely responsible, and the platform
- shall not be involved. If losses are incurred, you shall compensate for such losses.
-
- 15. You undertake to actively maintain the image of the platform, and you shall not engage in any behavior that
- is detrimental to the image or interests of the platform. During the term of this agreement and after the
- termination of the agreement, you shall not publish or imply in any way through any channel any speech
- unfavorable to the platform.
-
- 16. Without written consent, during the use of the platform, you shall not mention or display the names, logos,
- registration numbers, images, etc., of other live broadcasting platforms in any form (including but not limited
- to personal dynamics, personal profile pages, live room names, posters, text, voice, pictures, backgrounds,
- etc.), nor shall you guide existing platform users, other broadcasters, or employees to enter other live
- broadcasting platforms or provide any services, information, or convenience to them, otherwise, you have the
- right to take punitive measures against your breach of contract.
-
- 17. Only platform services are provided, and if you establish contractual relationships with studios, agencies,
- or other third-party organizations, the disputes arising therefrom shall be unrelated to the platform, and the
- platform shall not bear any responsibility.
-
- 18. If you are assigned by a studio, agency, or other third-party organization with whom you have signed
- relevant agency or service agreements to conduct live interactions, any virtual props and income you receive
- will be fully paid to the aforementioned organization. Settlement will be handled by the said organization. You
- agree not to make any claims regarding the aforementioned virtual props or income at any time.
-
- 19. The platform is committed to spreading positive energy to all users and building a green and healthy
- internet audio platform. Therefore, you and the platform unanimously agree that if the platform receives
- complaints or requests for refunds regarding minors purchasing gifts, after verification by relevant national
- judicial or administrative departments or guardians, both parties are willing to refund the full amount to the
- guardians of the minors or to the designated units or personnel of the national judicial or administrative
- departments based on the amounts received. You further acknowledge that you irrevocably authorize the deduction
- of the refunded amount from your account. If your account balance is insufficient to cover the deduction or if
- the guardians of the minors or the national judicial or administrative departments have the right to request you
- to make up for the shortfall.
-
- Article IV Intellectual Property
-
- 1. The service, including operated websites, mobile application software, and the contained text, images, audio,
- trademarks, service marks, company names, and copyrights, among other elements, enjoys full intellectual
- property rights or has been obtained through legal authorization. The aforementioned intellectual property is
- protected by relevant laws. With consent, none of the aforementioned materials may be directly or indirectly
- published, broadcasted, rewritten, or redistributed for broadcasting or publishing purposes in any media, or
- used for any other commercial purposes by you. The entirety or any portion of the aforementioned intellectual
- property may only be saved on a computer for personal use. No legal liability is assumed towards you or any
- third party for any delay, inaccuracy, error, omission arising from or in connection with the creation,
- transmission, or submission of the aforementioned intellectual property.
-
- 2. All rights to any software used to provide network services (including but not limited to any images, photos,
- animations, recordings, music, text, additional programs, and accompanying materials) belong to the copyright
- holder of that software. Without the permission of the copyright holder of the software, you may not engage in
- reverse engineering, reverse compilation, reverse assembly, or any other acts to discover the original code of
- the products related to the platform services, including webpages, applications, software, etc. Otherwise, you
- shall be liable to the copyright holder of the software for corresponding legal responsibilities.
-
- 3. The results generated by you during the provision of live streaming services on the platform (including but
- not limited to live audio, and any text, audio, etc., related to the matters covered by this Agreement,
- collectively referred to as "Anchor Results"), unless proven otherwise, you are deemed to be the copyright owner
- of the signed anchor results. Unless otherwise agreed, by providing live streaming through the platform, you are
- deemed to have the right and agree to grant a free, permanent, irrevocable, exclusive, and transferable right,
- including but not limited to: the right of reproduction, distribution, rental, exhibition, performance,
- screening, broadcasting, information network dissemination, production, adaptation, translation, compilation
- rights, and other copyright-related property rights and neighboring rights.
-
- 4. The right to use the anchor's portrait, image, name, nickname, and any other relevant image or logo for
- commercial purposes without the need for your permission or additional payment.
-
- 5. The right to independently safeguard the intellectual property rights mentioned in the third item above in
- your own name. You shall actively cooperate and provide any documents required during the assertion of rights.
-
- 6. We attach great importance to and respect the protection of copyright and other intellectual property rights.
- You warrant that you have legitimate intellectual property rights and related rights to the internet live
- streaming content you publish, and there are no circumstances of infringement of third-party legitimate rights
- and interests. You also guarantee that you or authorized third parties have legal and sufficient rights for the
- aforementioned authorization, use, etc. You shall ensure that the use of the aforementioned anchor results by
- you or your authorized third parties will not infringe upon any third-party legitimate rights and interests
- (including copyrights, performer rights, portrait rights, etc.), and you are not required to pay any fees to any
- third party. Otherwise, you shall compensate for any losses incurred.
-
- 7. If it is found or reported by others that the internet live streaming content you have published violates
- relevant laws and regulations or the provisions of this Agreement or infringes upon rights, we reserve the right
- to delete the relevant content at any time without notice, and depending on the severity of the actions, impose
- penalties on you including but not limited to warnings, restrictions or prohibitions on using all or part of the
- service functions, temporary or permanent freezing or closure of accounts/rooms, and reclaiming or canceling
- accounts, and announce the processing results.
-
- 8. If the content published by you violates laws, regulations, agreements, or infringes upon rights, and/or
- causes responsibility to be borne by the platform, you shall indemnify all losses suffered by the platform,
- including but not limited to fines, compensation, litigation fees, lawyer fees, notary fees, public relations
- expenses, travel expenses, and other direct or indirect losses.
-
- Article V Confidentiality Obligations
-
- 1. You shall strictly abide by the confidentiality system of the Platform and undertake to keep the commercial
- secrets of the Platform confidential indefinitely. If you breach the agreement by using or disclosing the
- commercial secrets of the Platform, and as a result, the Platform suffers any direct or indirect losses in
- reputation, reputation, or economically, you shall indemnify the Platform with USD 100,000 as liquidated
- damages. If this amount is not sufficient to compensate for the losses incurred by the Platform, you shall
- compensate for the remaining losses. Commercial secrets refer to all information related to the business, which
- can bring economic benefits and have practicality, are not publicly known, and are provided by the Platform or
- learned by you during the use of the Platform services or for which third parties have confidentiality
- obligations. This includes but is not limited to: technical information, operational information, administrative
- management-related information and documents (including the content of this Agreement and related agreements),
- the amount and settlement method of the service fees you receive, standards, ownership, authorization methods,
- customer lists, lists of other anchors, contact information, service fees, staff lists, and other non-publicly
- known information.
-
- 2. You shall strictly abide by this Agreement and shall not, without written authorization or consent, do the
- following with the commercial secrets of the Platform:
-
- 1) Disclose or leak them to third parties or the general public in any way;
-
- 2) Use the commercial secrets for purposes other than those stated in this Agreement.
-
- 3. This clause remains valid after the termination of this Agreement.
-
- Article VI Amendment, Termination, and Conclusion of the Agreement
-
- 1. The Platform has the right to amend, terminate, or suspend this Agreement as necessary and will notify it on
- relevant pages. Once the amended agreement is published on the relevant pages, it shall replace the original
- agreement.
-
- 2. Both parties may terminate the agreement by mutual agreement.
-
- 3. If you have any of the following circumstances, the Platform has the right to terminate this Agreement
- immediately without prior notice:
-
- 1) If it is discovered that you have violated the statements and commitments made in this Agreement;
-
- 2) If your personal actions directly or indirectly cause damage to the interests;
-
- 3) Violation of Chinese or local laws, regulations, or normative provisions, public order, good customs, social
- morality;
-
- 4) Violation of other obligations stipulated in this Agreement;
-
- 5) Failure to correct passive or non-compliant performance of this Agreement within 10 days after notification.
-
- Article VII Breach of Contract Liability
-
- 1. You shall be responsible for all direct and indirect expenses, losses, and compensation incurred by any
- infringement of the legitimate rights and interests of third parties due to your actions, including but not
- limited to any reasonable expenses incurred for this purpose.
-
- 2. The Platform has the right to claim compensation from you for any losses caused by your violation of the
- provisions of this Agreement or the failure of the live streaming services you provided to meet the
- requirements.
-
- Article VIII Other
-
- 1. This Agreement is an integral part of the "Molistar User Registration Service Agreement." The contents not
- explicitly stated in this Agreement shall be subject to the relevant terms of the "Molistar User Registration
- Service Agreement." This Agreement may be updated by Molistar at any time. Once the updated terms of the
- Agreement are published, they shall replace the original terms of the Agreement, and no further notice will be
- given. You can view the latest version of the Agreement on the Molistar platform. After Molistar modifies the
- terms of the Agreement, if you do not accept the modified terms, please stop using the services provided by
- Molistar immediately. Your continued use of the services provided by Molistar will be deemed as acceptance of
- the modified Agreement.
-
-
-
-
-
+
+
+
+
+
+
+
+
+
\ No newline at end of file
diff --git a/view/molistar/modules/rule/local/ar.js b/view/molistar/modules/rule/local/ar.js
new file mode 100644
index 00000000..0e11ab15
--- /dev/null
+++ b/view/molistar/modules/rule/local/ar.js
@@ -0,0 +1,6 @@
+// 英文
+langAr = {
+ // 模块
+ demoModule: {
+ }
+}
\ No newline at end of file
diff --git a/view/molistar/modules/rule/local/en.js b/view/molistar/modules/rule/local/en.js
new file mode 100644
index 00000000..1add594f
--- /dev/null
+++ b/view/molistar/modules/rule/local/en.js
@@ -0,0 +1,1730 @@
+// 英文
+langEn = {
+ // 模块
+ demoModule: {
+ // ==========================================sdk==================================
+ sdk_title: `Third-party SDK Directory`,
+ sdk_body: `
Molistar Third-party SDK Directory
+
To ensure the realization of certain independent functions and to enable you to use and enjoy more services and
+ functions, we embed third-party SDKs in the application. We will carefully evaluate the purpose of using such
+ SDKs.
+
Please understand that the functions and services of third-party SDKs are constantly updated and developed. The
+ types of data they handle and other content may change due to functional or policy adjustments. Please refer to
+ the relevant introduction of personal information publicly disclosed by the third party.
+
+
+
+
SDK Name
+
Purpose of Use
+
Types of Personal Information
+
Third-party Privacy Policy Link
+
+
+
NetEase Cloud IM SDK
+
Collect and send end-user voice information
+
Network access, Wi-Fi access status, device information, storage card content, obtain IMEI
+ information, obtain IMSI information, obtain MAC, obtain APNS Token, operator type, obtain
+ application information installed by the system
+
https://commsease.com/en/clauses?serviceType=3
+
+
+
Shanghai Qiniu Cloud Object Storage
+
Upload user avatar, publish dynamic content
+
Network access, read/write external storage
+
https://www.qiniu.com/agreements/privacy-right
+
+
+
Agora
+
Provide real-time audio and video cloud services
+
Recording microphone permission, camera permission, phone status, Wi-Fi status access, network
+ status, operator information, Bluetooth access, network access, modify audio settings, read/write
+ external storage, keep device awake
+
https://www.agora.io/en/privacy-policy/
+
+
+
Tencent Cloud TRTC SDK
+
Provide real-time audio and video cloud services
+
Manufacturer of the device, device model, system version, network type, screen resolution, CPU
+ information, IP address, network permissions, storage permissions, microphone permissions, audio
+ permissions, Bluetooth permissions, camera permissions, phone permissions
+
+ This agreement is made between the user and the Molistar team (hereinafter referred to as "we") for the product
+ MolistarAPP (hereinafter referred to as "Molistar") provided by us regarding user recharge and use of the
+ recharge service provided by "Molistar". In order to obtain recharge service, the service user (hereinafter
+ referred to as "user") agrees to all the terms of this agreement and completes all recharge procedures according
+ to the prompts on the page. By clicking "Agree" or "Accept" or similar buttons during the recharge process, or
+ by actually completing the recharge service, the user indicates full acceptance of all terms under this
+ agreement.
+
+ Special Note: The recharge service provided by "Molistar" is only for adults. If you are a minor, please stop
+ using this service immediately. If you are a minor but continue to use this service, "Molistar" bears no
+ responsibility for your actions during your use of this service, nor for any consequences arising from such
+ use.
+
+ Chapter I Service Description
+
+ Article 1 Molistar is a social platform for audio and video provided by us to users, which provides services
+ required for audio and video socializing such as virtual gifts, technical support, and traffic
+ entrances.
+
+ Article 2 The ownership, operation rights, and management rights of the platform belong to Molistar.
+
+ Chapter II Rules for Purchasing Virtual Currency
+
+ Article 3 There are two kinds of virtual currency within the Molistar platform, namely "Diamonds" and "Coins",
+ both of which are virtual currencies provided by us for related consumption on the platform.
+
+ "Diamonds" can only be used to purchase virtual gifts on the platform. Virtual gifts purchased with "Diamonds"
+ can be gifted to chat room service personnel.
+ "Diamonds" can be used to purchase various products and services on the platform except for virtual gifts and
+ opening noble titles. Products and services purchased with "Diamonds" cannot be gifted to chat room service
+ personnel. You can exchange a certain number of "Diamonds" for "Coins" in your account according to the
+ proportion set by the platform, and then use "Diamonds" to purchase virtual gifts on the platform.
+ The exchange rate between "Diamonds" and "Coins" and the recharge currency is based on the value displayed on
+ the recharge page. If you do not agree to our revised rules, please stop using the "Diamonds" and "Coins"
+ purchase functions of Molistar.
+
+ Article 4 When recharging, you must carefully confirm your account and read the recharge rules carefully. If any
+ damage to your own rights and interests is caused by reasons such as inputting the wrong account or improper
+ operation due to your own reasons, the platform will not compensate or indemnify. Users understand and agree
+ that for any transactions or gifts made by users outside the platform, such as bank transfers, third-party
+ payment platforms, gift giving, etc., users should understand the risks and independently bear the corresponding
+ losses. The platform does not bear any responsibility for user behavior outside the platform.
+
+ Article 5 After a successful recharge, the "Diamonds" and "Coins" generated by the recharge can be freely used
+ by you on the platform, but the platform will not provide any direct refund or reverse exchange service.
+
+ Article 6 If the platform discovers processing errors caused by system malfunctions or any other reasons,
+ regardless of whether it is favorable to the platform or to you, the platform has the right to correct the error
+ after notifying you by email, WeChat, or other reasonable means. If this measure results in the actual receipt
+ of "Diamonds" and "Coins" by you being less than the "Diamonds" and "Coins" you should receive, the platform
+ will make up the difference to your account as soon as possible after confirming the processing error. If the
+ error results in you receiving more "Diamonds" and "Coins" than you should, the platform has the right to deduct
+ the difference directly from your account regardless of the nature and cause of the error.
+
+ Chapter III Rights Statement
+
+ Article 7 You can check the balance of your "Diamonds" and "Coins" on the mobile APP at any time. If you have
+ any objections to the records, you should immediately contact customer service of the platform. If there is
+ indeed an error after the platform's verification, it will be corrected; otherwise, you agree that the
+ transaction records on the platform will be the sole valid basis for "Diamonds" and "Coins"
+ transactions.
+
+ Article 8 The platform has the right to set relevant matters involving transactions from time to time based on
+ considerations of transaction security, including but not limited to transaction limits, transaction frequency,
+ etc. After updating the relevant content, the platform will notify you to review the latest version of the
+ agreement terms through explicit means (such as push messages, pop-ups, red dot prompts, etc.), and you can
+ choose whether to accept the modified agreement content freely.
+
+ Article 9 When recharging, you should ensure that you are the owner of the bound Alipay or WeChat account, can
+ legally and effectively use the account, and have not infringed on any legitimate rights and interests of any
+ third party. Otherwise, you should be solely responsible for resolving any disputes arising from the actual loss
+ of the Alipay or WeChat account owner, and bear all legal responsibilities.
+
+ Article 10 If due to your own reasons, the platform cannot provide "Diamonds" and "Coins" purchase services or
+ any errors occur when providing "Diamonds" and "Coins" purchase services, you are responsible for it yourself,
+ and the platform does not assume any responsibility, including but not limited to:
+
+ 1. You did not operate in accordance with this agreement or any rules announced by the platform from time to
+ time;
+ 2. Because you actively cancelled the account or the account was cancelled;
+ 3. Losses or liabilities caused by the reasons of the third-party payment institution account you are bound
+ to;
+ 4. Losses caused by disclosing your password to others;
+ 5. Property losses caused by your intentional or gross negligence.
+
+ Article 11 If the platform's system cannot operate normally due to the following circumstances, causing you to
+ be unable to use various services or any virtual property to be lost, we do not assume any liability for
+ compensation, including but not limited to:
+
+ 1. During the system maintenance, upgrade, or adjustment period announced by the platform;
+ 2. Telecommunication or equipment failure that cannot transmit data;
+ 3. Obstacles to the platform system execution due to force majeure factors such as typhoons, earthquakes,
+ tsunamis, floods, power outages, wars, terrorist attacks, government regulations, etc.;
+ 4. Service interruption or delay caused by hacker attacks, technical adjustments or failures of the
+ telecommunications department, website upgrades, problems of related third parties, etc.
+
+ Chapter IV Penalty Rules
+
+ Article 12 If any of the following situations occur, the platform has the right to suspend or terminate the
+ network services provided to you under this agreement at any time without notifying you:
+
+ 1. The personal information you provided is not true;
+ 2. You violate the purchasing rules stipulated in this agreement.
+
+ The platform is not responsible for any losses caused by the interruption or termination of the recharge
+ service.
+
+ Article 13 If a user illegally purchases "Diamonds" and "Coins" through channels not approved by the platform,
+ the platform has the right to freeze the account and impose corresponding penalties, and severe cases may result
+ in account banning.
+
+ Article 14 When users violate national laws and regulations, the "Molistar" user agreement,
+
+ the provisions of this agreement, or other platform management regulations during the use of the platform, the
+ platform has the right to temporarily or permanently ban your account. From the account ban until the lifting
+ (if any), the remaining "Diamonds" and "Coins" in your account will be temporarily frozen or all deducted, and
+ cannot be used to continue purchasing virtual products or services on the platform, and the cash value of the
+ "Diamonds" and "Coins" you purchased will not be refunded.
+
+ Chapter V Miscellaneous
+
+ Article 15 The platform reserves the right to modify or supplement the contents of this agreement. The modified
+ text of this agreement will be announced on the platform or in other feasible ways recognized by the platform.
+ After the modification, users will be notified to review the latest version of the agreement terms through
+ explicit means (such as push messages, pop-ups, red dot prompts, etc.), and users can freely choose whether to
+ accept the modified agreement content.
+
+ Article 16 Matters not covered in this agreement shall be executed in accordance with the "Molistar" user
+ agreement.
+
+ Welcome to use the "Molistar" APP. In order to provide you with better services, before using the "Molistar"
+ service, users are requested to carefully read the "Molistar" User Service Agreement, "Molistar" Privacy Policy,
+ and any other agreements between you and "Molistar," and fully understand the entire content of the agreements.
+ This agreement is the rights and obligations regulations between users and the operator of "Molistar," Molistar
+ Team (hereinafter referred to as "we"), regarding all actions related to user registration, login, and usage of
+ "Molistar." Users should pay particular attention to and fully understand the agreement. If users do not agree
+ with this agreement or any of its terms, they should immediately cease registration.
+
+ If you are under 18 years old, please carefully read and fully understand this privacy policy with the
+ accompaniment of your guardian, and use our services or provide information with the consent of your
+ guardian.
+
+ Please note: The functions and services of the "Molistar" APP are mainly designed for adults. Users who are
+ minors should not download or use this product. Even if you have downloaded this product, once we determine that
+ you are a minor, your use of the product's functions and services will be restricted.
+
+ We will provide network services to users in accordance with the relevant terms of this agreement. When you
+ click to agree to the "Molistar" User Service Agreement, it indicates that you agree to and accept all the
+ contents of this agreement, and are willing to comply with all the rules and regulations publicly announced by
+ the "Molistar" platform. If you do not agree, you can stop registering, logging in, or using the relevant
+ services of the "Molistar" platform. If users have any opinions on this agreement or its modifications, they can
+ contact us through the contact information provided at the end of the page. We will actively value the opinions
+ of users. Before we respond, users should refrain from accessing or using any services related to
+ "Molistar".
+
+ Part One: Definitions
+
+ 1. "Molistar": The operator of the "Molistar" service, currently Molistar Team.
+
+ 2. "Molistar" Service: Various functional services displayed and provided on the "Molistar" APP. The specific
+ service content shall be subject to the version you download and use.
+
+ 3. "Molistar" Service Rules: All rules, interpretations, announcements, etc., published on the "Molistar"
+ website and subsequently published, as well as various rules, implementation details, product descriptions,
+ announcements, etc., published on the "Molistar" APP, activity pages, etc.
+
+ Part Two: Account Registration, Management, and Personal Data Protection
+
+ 1. Types of Accounts
+
+ Registration Account: You can register using your own mobile number or through your WeChat account to obtain a
+ registered account. Users can log in with their accounts to engage in relevant activities on "Molistar".
+
+ You should use genuine and valid information to register on "Molistar".
+
+ You understand and agree that you are obligated to maintain the truthfulness and validity of the information you
+ provide. You must not register or authenticate using false, impersonated resident identity information,
+ corporate registration information, organizational institution codes, etc. You shall be solely responsible for
+ any illegal, untrue, or inaccurate user information. The account name you set must not violate national laws and
+ regulations or Molistar platform rules regarding account name management. Otherwise, "Molistar" has the right to
+ block, suspend, or cancel your account name and report it to the competent authority.
+
+ The account information you apply to register must not contain the following illegal, adverse, or prohibited
+ content:
+
+ (1) Shall not contain the following illegal information:
+
+ (a) Contrary to the basic principles established by the Constitution;
+
+ (b) Endangering national security, leaking state secrets, subverting state power, or undermining national
+ unity;
+
+ (c) Harming national honor and interests;
+
+ (d) Distorting, vilifying, defiling, or denying the deeds and spirits of heroes and martyrs, insulting,
+ defaming, or otherwise infringing upon the name, image, reputation, and honor of heroes and martyrs;
+
+ (e) Advocating terrorism, extremism, or inciting terrorist activities or extremist activities;
+
+ (f) Inciting discrimination against groups, regional discrimination, etc.;
+
+ (g) Promoting vulgar, kitsch, and tacky content;
+
+ (h) May induce minors to imitate unsafe behaviors and violate social morality, induce minors' bad habits,
+ etc.;
+
+ (i) Other contents that have a negative impact on the network ecology.
+
+ (3) Prohibited Content:
+
+ (a) Counterfeit, imitate, fabricate the names, logos, etc., of political parties, government departments,
+ enterprises and institutions, people's organizations, and social organizations;
+
+ (b) Counterfeit, imitate, fabricate the names, logos, etc., of countries (regions), international
+ organizations;
+
+ (c) Counterfeit, imitate, fabricate the names, logos, etc., of news websites, newspapers, radio and television
+ institutions, news agencies, and other news media, or use names, logos, etc., with news attributes such as
+ "news", "reporting", etc., without authorization;
+
+ (d) Counterfeit, imitate, maliciously associate with the names, logos, etc., of important spaces such as
+ national administrative regions, the location of institutions, and landmark buildings;
+
+ (e) Intentionally embedding QR codes, URLs, email addresses, contact information, etc., for the purpose of
+ damaging public interests or seeking undue benefits, or using homophonic, homophonic, similar texts, numbers,
+ symbols, and letters;
+
+ (f) Contains untrue or exaggerated content that may deceive the public or cause misunderstandings.
+
+ If the platform finds that any custom name, account, etc., registered or used by you is the same as that of
+ other users, making it impossible to distinguish, the platform has the right to request you to modify the above
+ names. If you fail to make the modification within the time limit requested by the platform, the platform has
+ the right to add identification symbols after your custom name without your consent to distinguish it to ensure
+ the normal operation of the software (for example, if you wish or are using the account name "Molistar", but
+ there is another user account name "Molistar" in the same group of servers, then if you are unwilling to modify
+ the name, the platform has the right to add identification symbols after your name without your consent,
+ becoming "Molistar1", "Molistar2", etc.), you unconditionally agree to the above modification.
+
+ 2. Account Attributes and Management
+
+ Ownership of the "Molistar" account belongs to the Molistar Team. Once registered, the account is only for your
+ personal use and may not be lent, gifted, rented, transferred, sold, or shared with others. After obtaining an
+ account, please abide by the terms of this agreement and properly manage your account and password. If you find
+ that your account or password has been illegally used by others or other abnormal situations, it is recommended
+ that you contact "Molistar" immediately and cooperate with "Molistar" to resolve the above problems. "Molistar"
+ shall not be liable for any loss caused by the user's failure to properly safeguard their account name and
+ password.
+
+ In order to better provide services and assistance and protect the legitimate rights and interests of users, the
+ information provided when applying for registration must be true, accurate, legal, and valid, and be updated in
+ a timely manner to avoid restrictions or inability to use during use. If there are changes in relevant data
+ information during the use of "Molistar", you should update the data information in a timely, true, accurate,
+ complete, and valid manner and follow the guidance of "Molistar" for changes. If you fail to update the relevant
+ information in a timely manner and notify "Molistar", you shall bear all responsibilities and losses caused
+ thereby.
+
+
+ Part Three Platform Services and Regulations
+
+ 1. Molistar Platform Services
+
+ The specific content of this service is provided by the Molistar team based on actual circumstances, including
+ but not limited to authorizing users to engage in voice interaction, instant messaging, following others,
+ posting comments, and sending virtual gifts through their accounts.
+ Users should make friends through payment methods, specifically: Users pay a certain amount of currency through
+ the payment methods provided by IOS or Google Play to purchase "Molistar" platform virtual currency - diamonds,
+ and then purchase desired gifts or chat with selected other users according to the tariff standards published by
+ the Molistar platform using virtual currency. For the charging standards, Molistar will provide users with clear
+ prompts before use. Only when users confirm their agreement to pay the fees according to the above payment
+ method according to the prompts and complete the payment behavior, can users use such charging services. The
+ completion of the payment behavior is subject to the confirmation notification of "payment completed" generated
+ by the bank or third-party payment platform.
+
+ 2. Live Platform Services
+
+ 2.1 Molistar live platform services are only available for use on the Molistar live platform. Any behavior that
+ maliciously separates the Molistar live service from the Molistar live platform by illegal means such as
+ cracking does not belong to the Molistar live service stipulated in this agreement. Any legal consequences
+ arising therefrom shall be borne by the perpetrator, and Molistar Live will pursue the legal responsibility of
+ the perpetrator according to law.
+
+ The official announcement method of the Molistar live platform is the only legitimate way to register, log in,
+ download, and use the Molistar live service. Any Molistar live service obtained through other unauthorized
+ channels, methods, or means not authorized by Molistar Live (including but not limited to accounts, gold coins,
+ etc.) is illegally obtained, and Molistar Live does not recognize its effectiveness. Once discovered, Molistar
+ Live has the right to immediately delete, cancel, clear, and ban such treatment without notifying you, and any
+ adverse consequences caused thereby shall be borne by you. Molistar Live has the right to take corresponding
+ legal responsibilities for individuals or institutions.
+
+ Molistar has the right to announce to you (including but not limited to pop-up pages, website announcements,
+ station messages, etc.) to modify, replace, upgrade any software related to Molistar platform services. If you
+ do not agree or accept the modification, replacement, or upgrade of the software related to the Molistar
+ platform service, please stop using it immediately. Otherwise, it will be deemed that you agree and accept the
+ modification, replacement, or upgrade of the Molistar platform-related software, and the behavior of agreeing
+ and accepting is still subject to this agreement.
+
+ You understand and acknowledge that Molistar Live has the following rights, and the exercise of these rights by
+ Molistar Live does not constitute a breach, and you will not hold Molistar Live liable: You do not own the
+ experience, level, follow, title, virtual gifts, virtual presents, and rewards obtained by using the Molistar
+ live platform or Molistar live platform account, as well as any data information (including but not limited to
+ account data information, live broadcasting duration data information, virtual gift data information,
+ consumption data information, etc.) generated and stored in the Molistar live network database during the
+ operation of the Molistar live platform (hereinafter referred to as "Derivatives"). You confirm that you do not
+ have ownership rights to them (unless otherwise announced by the Molistar platform), and Molistar Live allows
+ you to use them in accordance with the rules of the Molistar live platform. Molistar Live does not bear any
+ compensation liability for the above derivatives. Molistar Live has the right to decide the withdrawal date
+ according to the actual situation without further notice to you and without your consent.
+
+ You agree and warrant that you shall not use the Molistar live service or its derivatives for illegal
+ profit-making activities such as resale, transfer, exchange, or mortgage. You will not infringe on the
+ legitimate rights and interests of others or Molistar Live through the Molistar live service or its derivatives,
+ and you are prohibited from stealing or misappropriating others' accounts, virtual gifts, etc. through network
+ vulnerabilities, malicious software, or other illegal means.
+
+ You understand and agree that if you pay or recharge the Molistar live platform account to purchase charged
+ services (including but not limited to purchasing the right to use virtual gifts in the Molistar live platform
+ and accepting other value-added services, etc.), Molistar Live has the right to modify or change the provided
+ charged services, charging standards, charging methods, service fees, and service terms as needed. Molistar Live
+ may now or in the future charge for some services, if you refuse to pay such fees, you will not be able to
+ continue using the relevant services after the start of charging. If you pay or recharge your Molistar live
+ platform account through a third-party payment tool, you may bear any commercial risks (including but not
+ limited to illegal use of your account or bank card by criminals for illegal activities), and you should
+ carefully perform payment and other related behaviors. Molistar Live does not assume any responsibility for your
+ aforementioned risks and losses.
+
+ Part Four Authorization and Collection of Information
+
+ In order to provide better services, "Molistar" will collect some of your information or data. When you register
+ for a "Molistar" account, clicking "Agree" on the "User Service Agreement" and "Privacy Policy" interface, or
+ using the "Molistar" service indicates that you have agreed and authorized "Molistar" to collect and analyze
+ some of your information.
+
+ Under normal circumstances, you can browse and modify the information in your account (such as nickname, avatar,
+ and account password) at any time. However, for security reasons (such as password recovery services), you may
+ not be able to modify certain initial registration information (such as account) and other verification
+ information provided at the time of registration.
+
+ We will establish a sound "Molistar" user information security management system to safeguard the security of
+ user information in accordance with relevant laws and regulations. Except with the user's consent, privacy
+ protection statement agreement, and legal provisions, your personal information will not be disclosed to any
+ other company, organization, or individual. For how "Molistar" collects, uses, stores, and protects your
+ personal information and other content, you can log in to ["My - Settings"] to read the "Molistar Privacy
+ Policy" for further understanding.
+
+ Users are prohibited from using other users' personal information in any way, such as collecting, copying,
+ storing, or disseminating it, during the process of using "Molistar" accounts and logging into the "Molistar"
+ platform. Otherwise, users shall bear the consequences arising therefrom.
+
+ Part Five Explanation of Earnings
+
+ "Molistar" has the right to independently formulate and change the profit rules. "Molistar" has the right to
+ decide or adjust the daily total amount of earnings for all users based on operational strategies and other
+ issues.
+
+ Part Six Account Cancellation
+
+ Please understand and agree that "Molistar" will cancel your account in the following circumstances, and will
+ not be responsible for this:
+
+ (1) Users can apply to cancel their account online without stealing coins or engaging in other behaviors that
+ violate laws and regulations or normative documents. The cancellation path is "My" - "Settings" - "Cancel
+ Account".
+
+ (2) Users violate laws and regulations, the provisions of this agreement, or the management regulations online
+ by "Molistar"; in accordance with relevant laws and regulations or the requirements of administrative and
+ judicial law enforcement agencies, "Molistar" will cancel your account.
+
+ After canceling the account, you will not be able to log in to "Molistar" or use the canceled account, and you
+ will not be able to find any records and messages in the account. The coins and diamond earnings in the account
+ will also be cleared to zero. Personal information related to your account will be deleted or
+ anonymized.
+
+ Part Seven Intellectual Property Rights
+
+ All intellectual property rights of "Molistar" (including but not limited to copyrights, trademarks, patents,
+ trade secrets) and all related information content (including but not limited to interface design, layout
+ framework, data, text, images, graphics, charts, audio, video, software, etc.), except for third-party
+ authorized software or technology, belong to "Molistar" and are protected by the laws and regulations of the
+ People's Republic of China and relevant international treaties. "Molistar" enjoys the above-mentioned
+ intellectual property rights, except as otherwise provided by law for relevant rights holders.
+
+ Without our or the relevant rights holders' written consent, users may not implement, utilize, transfer, or
+ license any third party to implement or utilize the above-mentioned intellectual property rights for any
+ commercial or non-commercial purposes on their own. We reserve the right to pursue unauthorized actions
+ mentioned above.
+
+ Part Eight Rights and Obligations
+
+ 1. Rights and Obligations of Users
+
+ You may use your registered account to log in to "Molistar" and have the right to autonomously choose to use or
+ not to use related services. However, you shall be responsible for all actions of your account, and the actions
+ of your account shall be deemed as your own.
+
+ When using "Molistar", you shall abide by the bottom line of seven items, including laws and regulations, the
+ socialist system, national interests, legitimate rights and interests of citizens, public order, social
+ morality, and the authenticity of information. When registering and using the "Molistar" account, the following
+ situations shall not occur:
+
+ (1) Violation of the Constitution or laws and regulations;
+
+ (2) Endangering national security, leaking state secrets, subverting state power, or undermining national
+ unity;
+
+ (3) Harming the national honor and interests or public interests;
+
+ (8) Insulting or slandering others, infringing on the legitimate rights and interests of others;
+
+ (9) Containing other content prohibited by laws, administrative regulations, or violating other provisions of
+ "Molistar".
+
+ If the content uploaded, published, or transmitted by you contains information or content that violates laws and
+ regulations as mentioned above or infringes on the legitimate rights and interests of any third party, you shall
+ directly bear all adverse consequences caused thereby. If this causes any adverse consequences to "Molistar",
+ you shall be responsible for eliminating the impact and compensating "Molistar" for all losses caused thereby,
+ including but not limited to property damage compensation, reputation damage compensation, lawyer fees,
+ transportation expenses, and other reasonable expenses incurred for safeguarding rights.
+ You should carefully read and comply with the relevant service rules, operation norms, usage procedures, and
+ other content publicly displayed on the service website of "Molistar," and accurately understand the relevant
+ content and possible consequences. During the use of the service, you should follow the relevant operation
+ instructions. You shall bear all consequences of your violation of relevant operation instructions, and
+ "Molistar" shall not bear any responsibility.
+
+ 2. Rights and Obligations of "Molistar"
+
+ "Molistar" will provide corresponding services in accordance with the provisions of this agreement and be
+ responsible for the daily maintenance and troubleshooting of the services. However, "Molistar" shall not be
+ responsible for any faults caused by your fault, force majeure, or reasons beyond the control of
+ "Molistar".
+
+ For the sake of service quality or necessity, "Molistar" may upgrade and maintain the service according to the
+ actual situation. During the upgrade and maintenance, your "Molistar" service may be temporarily unavailable.
+ You agree that "Molistar" shall not be responsible for this. "Molistar" will issue notices or notifications in
+ advance when upgrading or maintaining. Please support and cooperate with "Molistar" in the upgrade and
+ maintenance. If you do not cooperate with the above actions of "Molistar" and cause any consequences, you shall
+ bear all responsibilities.
+
+ Part Nine Notification and Disclaimer
+
+ 1. Notification
+
+ You agree that "Molistar" may send various notices to you through the following reasonable methods:
+
+ (1) Public announcements on the website;
+ (2) In-site messages, pop-up messages, and client push messages;
+ (3) Electronic mails, mobile phone messages, letters, etc., sent to the contact information you provided on the
+ "Molistar" platform.
+
+ Notifications sent by "Molistar" through the above methods shall be deemed as delivered upon successful
+ transmission. Written notices sent via paper medium shall be deemed as delivered five natural days after being
+ sent to the provided contact address.
+
+ For any disputes arising from transaction activities on the "Molistar" platform, you agree that judicial
+ authorities (including but not limited to people's courts) may serve legal documents (including but not limited
+ to litigation documents) to you via modern communication methods such as mobile phone messages, electronic
+ mails, or postal delivery. The contact information designated by you for receiving legal documents shall be the
+ mobile phone number, email address, etc., provided by you when registering or updating on the "Molistar"
+ platform. Service of legal documents by judicial authorities to the above contact information shall be deemed as
+ delivered. The postal address provided by you shall be your legal contact address or the valid contact address
+ you provided.
+
+ You agree that judicial authorities may adopt one or more of the above methods to serve legal documents to you.
+ If multiple methods are adopted, the delivery time shall be based on the earliest delivery among the
+ aforementioned methods.
+
+ You agree that the above delivery methods apply to various stages of judicial proceedings, including but not
+ limited to first-instance, second-instance, retrial, execution, and enforcement procedures.
+
+ You shall ensure that the provided contact information is accurate and valid and update it in real time. If the
+ provided contact information is inaccurate or if you fail to timely notify changes to the contact information,
+ resulting in the inability or untimeliness of legal document delivery, you shall bear the legal consequences
+ arising therefrom.
+
+ 2. Disclaimer
+
+ You shall bear all losses suffered due to the following reasons, and "Molistar" and its partners shall not be
+ liable:
+
+ - System shutdown maintenance, upgrades, adjustments announced by the platform, or third-party reasons such as
+ telecommunication equipment failures, computer viruses, or hacker attacks, technical problems, network or
+ computer failures, system instability, typhoons, earthquakes, tsunamis, floods, power outages, wars, terrorist
+ attacks, government control, and other force majeure reasons;
+ - "Molistar" will make every effort to maintain the security and convenience of all services on your account,
+ but it shall not be liable for any data deletion or storage failures that occur during the service. In the event
+ of a technical failure or other force majeure events affecting the normal operation of the service, "Molistar"
+ and its partners promise to cooperate with relevant units and promptly handle repairs. However, "Molistar" and
+ its partners shall not be liable for any losses suffered by users as a result.
+
+ You fully understand and agree that "Molistar" may change, suspend, restrict, or terminate part or all of the
+ services as needed for business development, unexpected situations, etc. "Molistar" making such changes does not
+ require prior notice. Users are aware of and voluntarily assume the risks and related legal responsibilities
+ associated with such changes.
+
+ Part Ten Agreement Amendment and Termination
+
+ 1. Agreement Amendment
+
+ "Molistar" has the right to modify or supplement the terms of this agreement in accordance with the needs of
+ national laws and regulations, technical and industry practices, market conditions, website operation, etc. The
+ modified or supplemented service terms will be updated in the "Settings - About Us" section, and users will be
+ reminded that once the agreement is published on this site, it will take effect immediately, replacing the
+ original service terms. Users can log in to check the latest service terms at any time. If users do not agree to
+ the updated service terms, they should immediately stop accepting the services provided by this site. If users
+ continue to use the services provided by this site, they will be deemed to have agreed to the updated user
+ agreement and will comply with the modified or supplemented terms.
+
+ 2. Agreement Termination
+
+ 2.1 You have the right to terminate this agreement by any of the following methods:
+
+ - Cancelling your account through the "Molistar" platform when the conditions for account cancellation announced
+ by the "Molistar" platform are met;
+ - Ceasing to use and expressing unwillingness to accept the changes before the changes take effect;
+ - Expressing unwillingness to continue using the services of the "Molistar" platform and meeting the termination
+ conditions of the "Molistar" platform.
+
+ "Molistar" may notify you to suspend or terminate this agreement in the following situations:
+
+ - You violate the provisions of this agreement, and "Molistar" terminates this agreement based on the breach
+ clause;
+ - You engage in behaviors such as transferring your account, misappropriating others' accounts, providing false
+ registration identity information, publishing prohibited content and information, deceiving others for property,
+ or using improper means for profit, and "Molistar" closes your account in accordance with the rules of the
+ "Molistar" platform;
+ - In addition to the above situations, you have repeatedly violated the relevant rules of the "Molistar"
+ platform with serious circumstances, and "Molistar" closes your account in accordance with the rules of the
+ "Molistar" platform;
+ - Your account is cleaned up or canceled by "Molistar" according to this agreement;
+ - You have engaged in activities on the "Molistar" platform that infringe on the legitimate rights and interests
+ of others or other serious illegal and non-compliant behaviors;
+ - Other situations in which "Molistar" should terminate the service according to relevant laws and
+ regulations.
+
+ 2.2 Handling After Agreement Termination
+
+ After the termination of this agreement, "Molistar" is not obliged to disclose any information in your account
+ to you or a third party unless otherwise provided by law.
+
+ After the termination of this agreement, "Molistar" enjoys the following rights:
+
+ - Cease the collection and use of your personal information but may continue to retain other content and
+ information left on the "Molistar" platform by you;
+ - For your past breach of contract, "Molistar" may still pursue your breach of contract liability according to
+ this agreement.
+
+ Part Eleven Version Upgrade
+
+ Whether this software will provide upgraded versions is determined by "Molistar" itself. If "Molistar" provides
+ upgraded versions of this software, unless the upgraded version includes new product agreements or other
+ significant changes, the upgraded version will still use this agreement. Your choice to perform the upgrade
+ action indicates that you have explicitly "agreed" to comply with the relevant "product agreements." If you do
+ not agree to any content of the "product agreements," please do not perform any upgrade actions.
+
+ Part Twelve User Default and Handling
+
+ 1. Default Determination
+
+ The following circumstances are considered as your default:
+ (1) Violation of relevant laws and regulations when using the Molistar platform services;
+ (2) Violation of the provisions of this agreement or the supplementary agreement of this agreement.
+ To adapt to the development of the Internet industry and meet the needs of a large number of users for efficient
+ and high-quality services, you understand and agree that Molistar may stipulate the procedures and standards for
+ default determination in the Molistar platform rules. For example, Molistar may determine whether you have
+ defaulted based on the relationship between your user data and the massive user data; you have an obligation to
+ provide sufficient evidence and reasonable explanations for abnormal phenomena in your data, otherwise, you will
+ be deemed to have defaulted.
+
+ 2. Default Handling Measures
+
+ If the content and information you publish on the Molistar platform constitute a default, Molistar may
+ immediately delete, block, or take other measures against the relevant content and information according to the
+ corresponding rules, or suspend, seal, freeze, or clear virtual gifts, cancel your account, etc.
+ If your actions on the Molistar platform, or actions that, although not carried out on the Molistar platform,
+ affect the Molistar platform and its users, constitute a default, Molistar may, according to the corresponding
+ rules, impose restrictions on your account participating in activities, suspend part or all of the services
+ provided to you (such as sealing virtual live broadcast rooms, freezing or clearing virtual gifts, deducting
+ default fines, etc.), seal your account, and terminate the services provided to you. If your account is sealed,
+ the virtual products such as coins and virtual gifts in your account will be cleared, and the relevant virtual
+ product services will be terminated.
+ If your actions on the Molistar platform violate relevant laws and regulations, Molistar may report your usage
+ records and other information to relevant competent authorities in accordance with the law. At the same time,
+ Molistar may publicize information about the measures taken against your default behavior and other illegal
+ information confirmed by effective legal documents issued by national administrative or judicial authorities on
+ the Molistar platform. In addition, Molistar may, in accordance with relevant national laws and regulations,
+ implement blacklist management and credit management for you, provide management and services linked to credit
+ ratings, and if you are included in the blacklist, have the right to take measures to prohibit you from
+ re-registering an account, and report to relevant departments in a timely manner.
+
+ Part Thirteen Other
+
+ 1. Regardless of the reason, if any part of this agreement is invalid or unenforceable, the remaining terms
+ remain valid and binding on both parties.
+
+ 2. Our contact email is wuhandonglin@gmail.com, any complaints, suggestions, or other questions from users can
+ be sent to us via this email.
"Molistar" (hereinafter referred to as "we") fully understands the importance of personal information to you,
+ and we will provide you with more complete and reliable services in accordance with legal regulations. In
+ order to provide you (hereinafter referred to as "you" or "users") with more accurate and personalized
+ services, this application will use and disclose your personal information in accordance with this Privacy
+ Policy (referred to as "this Service Agreement"). The main purpose is to explain to you the types of
+ personal information and business scenarios we collect and use within the necessary scope, as well as the
+ basic rules for processing your personal information.
+
+ 1. How We Collect and Use Your Personal Information
+
In order to provide services, we must process information about you. Please note that we only collect
+ information from you for legitimate purposes and under necessary conditions. You can choose not to provide
+ any data or information sought for collection. In this case, you may not agree to this policy. Accordingly,
+ we have the right not to provide services to you. We collect information in the following ways:
+ 1.1. Information and Content You Provide
+
We collect personal information, messages, and other information you provide when using our services,
+ including information you provide when registering an account, creating or sharing content, or communicating
+ with other users. With your consent, we will also collect contact information that you choose to upload,
+ sync, or import from your device into the services we provide.
+ 1.2. Information and Content We Collect with User Consent
+
1.2.1. Your Usage Information. We collect information generated when you use our services and information
+ from third parties (such as when you access our services through social media accounts), such as your phone
+ number and password; the types of content you view or participate in; the features you use; the actions you
+ take; the time, frequency, and duration of your activities; your feedback, etc.
+
1.2.2. Device Information. We collect and record information about the devices you use based on the access
+ permissions granted when installing and using our services. We will strictly adhere to the rules and
+ regulations of data collection, respecting and protecting your rights and interests. Specifically as
+ follows:
+ (1) Registration and Login
+
+
You can create an account with your mobile phone number. You need to provide your mobile phone number.
+ We need to collect your mobile phone number to verify the validity of your identity by sending a SMS
+ verification code to your registered mobile phone. After registration, the system will assign you an
+ avatar and nickname. You can modify your avatar and nickname. Collecting this information is to help you
+ complete the registration.
+
You can also log in to "Molistar" through third-party platforms. We will obtain your personal
+ information (avatar, nickname, gender) registered on the third-party platform. After collecting it, we
+ will only use it for your login to "Molistar" and will not use it for other purposes.
+
You can set your personal profile according to your own situation, choose to fill in and complete your
+ gender, birthday, and other information. Collecting this information is for displaying your personal
+ profile. You can also choose not to fill in this part of the information, which will not affect your use
+ of the "Molistar" software.
+
+
+ (2) Business Functions
+
Our product features include:
+
+
Upload Avatar
+
+
When you log in to the Molistar product, we will, according to your choice, access your phone's photo album
+ or call upon your phone's camera function so that you can complete your avatar information by accessing
+ photos in the album or taking photos. If you do not agree to us accessing the above permissions, you may not
+ be able to complete uploading the avatar. Please be aware that even if you have agreed to open camera or
+ album permissions, relevant processing will only occur within the scope of photos you actively shoot or
+ select.
+
+
Message Posting
+
+
After you register as a Molistar user, you can post text, pictures, and voice messages. We need to collect
+ the information you post and display your nickname, avatar, and posted content.
+
+
Voice Broadcasting
+
+
If you wish to use the voice call function, we will request permission to access your device's microphone so
+ that you can make voice calls with others through the recording function in the microphone. If you refuse to
+ grant microphone permissions, you will be unable to use the voice call function, but it will not affect your
+ normal use of other Molistar functions. If you wish to use the voice broadcast function, we will request
+ permission to access your device's microphone and camera so that you can better conduct voice broadcasts
+ with others (friends). If you refuse to grant microphone and camera permissions, you will be unable to use
+ the voice broadcast function, but it will not affect your normal use of other Molistar functions.
+
+
Recharge and Consumption-related Functions or Services
+
+
When you use the consumption functions of our product, we will collect your recharge and consumption records
+ to allow you to query your transaction records and protect your property and virtual property to the
+ greatest extent possible. In addition, we may also collect some other information related to orders,
+ including transaction goods or service information, order number, transaction amount, order time, order
+ merchant, order number, order status, payment method, payment account, payment status. We collect this
+ information to help you complete transactions smoothly, ensure the security of your transactions, query
+ order information, provide services, etc. The above information is sensitive, but collecting it is necessary
+ to realize relevant functions, otherwise, transactions cannot be completed. We cannot obtain your personal
+ property information based solely on this information, nor can we identify specific natural person identity
+ information.
+ (3) Information Provided by You Proactively in Using the "Molistar" Service
+
When you need to save a picture from "Molistar" to your local device, "Molistar" will access your local photo
+ album to store the picture you need to save. Before accessing it, "Molistar" will clearly prompt you to
+ access your local photo album, and only with your explicit consent can you save the picture locally.
+ (4) Operation and Safe Operation
+
In order to provide you with a secure and reliable usage environment and enjoy more trustworthy and
+ high-quality product features and services. We need to collect the following information about your device
+ to maintain the normal and stable operation of product-related functions or services, improve the security
+ of the system when you use our product functions and services, more accurately prevent phishing website
+ fraud, protect account security, ensure network security, operational security, and eliminate malicious
+ cheating behaviors:
+
+
To ensure the secure operation and quality and efficiency of software and services, we will collect data
+ from your device, such as hardware model, operating system version number, SD card data, device
+ identifiers (IMEI, AndroidID, OAID, IMSI, ICCID, GAID, MEID; different identifiers have different
+ validity periods, whether they can be reset by users, and how they are obtained), hardware addresses of
+ network devices (MAC addresses), hardware serial numbers, IP addresses, WLAN access points (such as
+ SSID, BSSID), base stations, software version numbers, network access methods, types, statuses, network
+ quality data, operations, usage, service logs, sensor information, and application software installation
+ lists.
+
+
Log information includes:
+
+
Usage information of this software: the version number of the software you use, the overall operation
+ status of the software, and your usage frequency. Such information is anonymous, and we will not match
+ it one by one or match it with your personal identity information.
+
Network security-related log information (network collapse, system activity information). Such
+ information is collected as required by law. If you do not want such information to be collected by us,
+ please do not use this software.
+
+
+
1.3. Please understand that the collection of device information is the premise and basis of our
+ service
+ provision. After you install and open this software, we will seek your consent through "authorization
+ pop-ups".
+
1.4. Individual device information alone cannot identify specific natural person identity, and we have
+ de-identified and anonymized such information.
+ 2. Exemption from Consent for Collection and Use of Personal Information According to Law
+
Please understand that in the following circumstances, according to laws, regulations, and relevant national
+ standards, we may collect and use your personal information without obtaining your authorization:
+
+
Related to the fulfillment of legal obligations by the personal information controller;
+
Directly related to national security and defense;
+
Directly related to public safety, public health, and significant public interests;
+
Directly related to criminal investigation, prosecution, trial, and execution of judgments;
+
Necessary for the protection of the life, property, and other significant legitimate rights and
+ interests of the personal information subject or other individuals but it is difficult to obtain the
+ consent of the individual;
+
+
The personal information involved is voluntarily disclosed to the public by the personal information
+ subject;
+
Necessary for signing and fulfilling contracts at the request of the personal information subject;
+
+
Collecting personal information from legally disclosed information, such as legal news reports,
+ government information disclosure, etc.;
+
Necessary to maintain the security and stable operation of the provided products or services, such as
+ discovering and dealing with faults in products or services;
+
Necessary for news units engaged in legitimate news reporting;
+
Necessary for academic research institutions, for statistical or academic research necessary for
+ public interest, and when providing academic research or describing the results externally, the personal
+ information contained in the results is de-identified.
+
+ 3. Use of COOKIES and Similar Technologies
+ 3.1. Introduction to COOKIES and Similar Technologies
+
We or our third-party partners may obtain and use your information through COOKIES and WEB BEACON, and store
+ such information as log information.
+ COOKIES refer to a technology where when a user visits a website equipped with COOKIES, the website's server
+ automatically sends COOKIES to the user's browser and stores them on the user's mobile device. These COOKIES
+ are responsible for recording various activities, personal information, browsing habits, consumption habits,
+ and even credit records of the user's visits to the website in the future. COOKIES technology enables us to
+ provide services better and faster, and enables this platform to serve you more effectively.
+ 3.2 Purposes of Using COOKIES and Similar Technologies
+
We use our own COOKIES and WEB BEACON for the following purposes:
+
+
Remembering your identity;
+
Analyzing and optimizing our service situations;
+
+ 3.3. Authorized Use of COOKIES and WEB BEACON
+
Cookie and device information identifiers and similar technologies are commonly used in the Internet. When
+ you use "Molistar" and related services, we may use such technologies to send one or more COOKIES or
+ anonymous identifiers to your device to collect and identify information about your visits and use of this
+ product. We promise not to use COOKIES for any purposes other than those described in this Privacy Policy.
+ We use COOKIES and similar technologies mainly to achieve the following functions or services:
+
+
Ensuring the safe and efficient operation of products and services
+
+
We may set COOKIES or anonymous identifiers for authentication and security protection to confirm whether you
+ are securely logged into the service, or whether you encounter theft, fraud, and other illegal activities.
+ These technologies also help us improve service efficiency and enhance login and response speeds.
+
+
Data analysis and anomaly troubleshooting
+
+
(1) We may use such technologies to understand your usage habits, conduct data analysis, and improve product
+ services.
+
(2) In using "Molistar", we may use COOKIES to record browsing activities for troubleshooting crashes,
+ delays, and other related anomalies, and to explore better service methods.
+
+
Clearing COOKIES
+
+
Most browsers provide users with functions to clear browser cache data, and you can perform corresponding
+ data clearing operations in the browser settings. If you clear them, you may not be able to use services or
+ functions provided by us that rely on COOKIES.
+
+ 4. How We Share, Transfer, and Publicly Disclose Your Personal Information
+ 4.1 Preconditions for Sharing Information
+
We will not share your personal information with any other companies, organizations, and individuals except
+ in the following circumstances:
+
+
With your explicit consent or authorization beforehand;
+
Sharing is required pursuant to applicable laws, regulations, or mandatory administrative or judicial
+ requirements;
+
Sharing Information for Security and Statistical Analysis
+
+
Ensuring Security: We attach great importance to the security of accounts and services. In order to protect
+ the security of your and other users' accounts and properties, and to protect your and our legitimate rights
+ and interests from illegal infringements, we or service providers may share necessary device, account, and
+ log information.
+ Analyzing Product Usage: To analyze the usage of our services and improve user experiences, we may share
+ statistical data on product usage (crashes, crashes) with affiliates or third parties. This data is
+ difficult to combine with other information to identify your personal identity.
+
For companies, organizations, and individuals with whom we share personal information, we will sign strict
+ confidentiality agreements with them and require them to handle personal information in accordance with our
+ instructions, this Privacy Policy, and other relevant confidentiality and security measures. At the same
+ time, we will only provide information to third parties covering the scope and effectiveness of promotion,
+ without providing information that can identify you, or we will aggregate and anonymize this information so
+ that it cannot identify you personally. We will only share your information for legitimate, necessary, and
+ specific purposes.
+
+
Transfer of Personal Information in Acquisitions, Mergers, or Reorganizations
+
+
As our business continues to develop, we may conduct mergers, acquisitions, asset transfers, or similar
+ transactions, and your personal information may be transferred as part of such transactions. We will require
+ the new holder of your information to continue to be bound by this Privacy Policy. Otherwise, we will
+ require the company or organization to re-obtain your authorization.
+
+
Information Disclosure Based on Other Reasons
+
+
We may also retain, preserve, or disclose your personal information for the following reasons:
+
+
Authorized or consented by "Molistar" for disclosure;
+
Compliance with applicable laws and regulations;
+
Compliance with court orders or other legal proceedings;
+
Compliance with requests from relevant government agencies.
+
We believe it is reasonably necessary to comply with applicable laws and regulations, maintain social
+ public interests, protect our or our group companies, our customers, other users, or employees' personal
+ and property safety or legitimate rights and interests, or public safety and interests, as well as other
+ circumstances deemed necessary by "Molistar" in accordance with the relevant provisions of "Molistar"
+ Terms of Service and Statements, or otherwise necessary.
+
+ 5. How We Access Partner SDKs
+
Please be aware that some of our services will be jointly provided by us and authorized partners. We will
+ access partner SDKs, for legitimate, necessary, specific, and clear purposes. They will collect your
+ personal information through SDK interfaces to realize product functions and services. We will demonstrate
+ to you the purpose of accessing partner SDKs; partners will collect the personal information necessary to
+ implement product functions and services through SDK interfaces; for the types or identities of partners,
+ please refer to the "Third-party SDK Directory". We will conduct security
+ monitoring of the accessed SDKs involving the collection of personal information to protect the security of
+ your personal information. We will only share your information for legitimate, necessary, and specific
+ purposes. We will collect de-identified information that cannot identify you personally. We will require
+ third-party service providers with whom we share information to fulfill relevant confidentiality obligations
+ and take corresponding security measures.
+ 6. How We Store and Protect Information
+
6.1 We will use encryption technology and anonymization processing, among other reasonable and
+ feasible means not lower than those of industry peers, to protect your personal information and employ
+ security protection mechanisms to prevent malicious attacks on your personal information
+
6.2 We will establish dedicated security departments, security management systems, and data security
+ processes to ensure the security of your personal information.
+
6.3 We implement strict data usage and access control systems to ensure that only authorized personnel
+ can access your personal information, and conduct security audits of data and technologies as needed.
+
6.4 Please note that when you voluntarily leave this software or navigate to, use, or access other
+ websites, services, and content resources based on this software, you should carefully consider any personal
+ information you submit to guard against potential risks that may harm your personal rights and interests.
+
+ 7. How Users Manage Information
+
We attach great importance to your concerns about personal information and make every effort to protect your
+ rights to access, correct, delete, and withdraw consent regarding your personal information, enabling you to
+ fully protect your privacy and security. Your rights include:
+
+
Your Personal Information
+
+
You have the right to access your personal information, except as otherwise provided by laws and regulations.
+ If you wish to exercise your data access rights, you can do so by accessing:
+
A. Personal data - You can view personal information data such as user ID, nickname, gender, birthday,
+ personalized signature, and personalized tag information by entering the "Molistar" App and clicking "Me" -
+ "Avatar".
+
B. Avatar - You can view your avatar by entering the "Molistar" App and clicking "Me" - "Avatar".
+
+
Canceling Your Account
+
+
You can submit an account cancellation request by clicking "Me" - "Settings" - "Cancel Account". Please note
+ that after you voluntarily cancel your account, we will stop providing products or services to you and
+ delete or anonymize your personal information, including any related earnings generated by the account.
+
Additionally, in cases where you violate the terms and conditions of service agreements with Molistar or
+ relevant national laws and regulations, your account may be canceled or deleted. Upon cancellation or
+ deletion of your account, all service data and information associated with the account will be deleted or
+ anonymized.
+ 8. Age Limitation
+
8.1 The software service is primarily intended for adults. Our products, websites, and services are
+ primarily aimed at adults. If you are a minor, you should read the privacy policy with the accompaniment of
+ your guardian before using our products and/or services and ensure that you have obtained your guardian's
+ consent to use our services and provide us with your information. We will pay particular attention to the
+ protection of minors' personal information in accordance with relevant national laws and regulations.
+
8.2 In cases where we collect personal information of minors with the consent of parents or legal
+ guardians, we will only use or disclose this information in accordance with the law,
+
with the explicit consent of parents or guardians, or as necessary to protect the interests of minors.
+
Nine, How to Contact Us
+
If you have any questions, comments, or suggestions regarding this Privacy Policy, please contact us at:
+
molistar666@gmail.com, and we will respond within 15 working days.
+ We will collect the following information voluntarily provided by you when using the service, as well as
+ information that may be collected through automated means during your use of the service. You can query and
+ manage the content of the following information through Molistar【Me】-【Settings】-【Personal Information & Permissions】-【Personal
+ Information Collection Checklist】and the contact information in the "Molistar
+ Privacy Policy".
+
+
+ Collection Scenario: Register, login account
+ Possible Personal Information to be Collected: Account nickname, avatar,
+ password, mobile number, third-party account information
+
+
+ Collection Scenario: Post dynamic
+ Possible Personal Information to be Collected: Content posted
+
+
+ Collection Scenario: Search
+ Possible Personal Information to be Collected: Keyword information, search
+ history, device information
+
+
+ Collection Scenario: Edit personal profile
+ Possible Personal Information to be Collected: Nickname, gender, birthday,
+ and additional information such as self-introduction as appropriate
+
+
+ Collection Scenario: Authentication
+ Possible Personal Information to be Collected: Name, mobile number, ID
+ information, facial recognition features
+
+
+ Collection Scenario: Withdrawal function
+ Possible Personal Information to be Collected: Withdrawal account related
+ information
+
+
+ Collection Scenario: Recharge function
+ Possible Personal Information to be Collected: Recharge records, consumption
+ records information, GooglePay and other payment information
+
+
+ Collection Scenario: Contact us through customer service channels for
+ help
+ Possible Personal Information to be Collected: Communication/call records and
+ related content, order information
+
+
+ Collection Scenario: Certain special situations (such as evaluating specific
+ user behaviors)
+ Possible Personal Information to be Collected: Copies or scans of relevant
+ written proofs
+
+ To ensure the functionality and security of Molistar, we may request or use
+ permissions from your device. Below, we display the device permissions that may be requested or used. As
+ Molistar evolves, if there are changes in the types and purposes of permissions
+ requested or used, we will update the list promptly.
+
+
+ Please note that third-party SDKs we integrate may also request or use certain device permissions.
+
+
+ Permission Name: Read Phone/Call Status
+ Permission Function Description: Obtain IMEI and IMSI device identification
+ information as well as the local phone number
+ Use Case or Purpose: Used for registration, login, security risk control,
+ preventing account theft, and assisting you in switching between answering calls and live broadcasts in the
+ background
+
+
+ Permission Name: Read/Write External Storage
+ Permission Function Description: Read and write data in the device storage
+ space
+ Use Case or Purpose: Used to ensure the stable operation of the application,
+ allowing users to read, write/download/save/modify images, files, crash logs, and other information when
+ using certain functions
+
+
+ Permission Name: Read/Write Clipboard Content
+ Permission Function Description: Read and write information in the clipboard
+ for quick copying, input, querying, and entering activities
+ Use Case or Purpose: Used for users to quickly copy, input, query, or enter
+ activities, allowing users to quickly read, write, copy, input, query, or enter data, links, text, images,
+ videos, etc., and provide matching results
+
+
+ Permission Name: Location
+ Permission Function Description: Obtain the geographical location information
+ of the device through GPS or network location information (such as base stations and WLAN)
+ Use Case or Purpose: Used for user socialization
+
+
+ Permission Name: Microphone
+ Permission Function Description: Record audio using the microphone
+ Use Case or Purpose: Used to send voice messages and assist you in
+ interactive voice broadcasting
+
+
+ Permission Name: Camera
+ Permission Function Description: Record video using the camera
+ Use Case or Purpose: Used for identity verification, completing photo
+ shooting and publishing, and security verification
+
+
+ Permission Name: Read/Write Album
+ Permission Function Description: Read and write content in the device's
+ album
+ Use Case or Purpose: Used for setting profile pictures and completing photo
+ publishing
+
+
+ Permission Name: Software Installation List
+ Permission Function Description: Obtain the package name list of installed
+ apps
+ Use Case or Purpose: Used to check whether the corresponding app is installed
+ when using third-party app login and sharing functions
+
+ Unless you have read and accepted all the terms of this agreement, you are not entitled to conduct live
+ broadcasts or enjoy related services.
+
+ Before you apply to become a network voice broadcaster (referred to as "broadcaster") on the platform and
+ provide online live broadcast services to platform users according to the application requirements and rules,
+ please carefully read and fully understand the following terms, especially the clauses regarding limitations,
+ exclusions, or exemptions from liability, which may be highlighted in bold for your attention.
+
+ This Live Broadcasting Service Agreement (hereinafter referred to as "this Agreement") stipulates the rights and
+ obligations between Guangzhou Time Online Network Technology Co., Ltd. and its affiliated companies (referred to
+ as "") and the broadcaster (referred to as "you") regarding the provision of voice broadcasting services by the
+ platform. Please read this agreement carefully before conducting voice broadcasts to ensure that you fully
+ understand the content of each clause in this agreement. Unless you accept all the terms of this agreement, you
+ are not entitled to use the services covered by this agreement. Your behavior of conducting voice broadcasts
+ will be deemed as acceptance of this agreement and agreement to be bound by the terms of this agreement.
+
+ Article 1 General Provisions
+
+ 1. Molistar provides you with platform broadcaster voice broadcasting services. After you agree to this
+ agreement, you can use the above services to perform and share online interactions. However, Molistar only
+ serves as a neutral internet live broadcast platform, only providing you with neutral technical support services
+ such as voice broadcasting services, and is not responsible for or able to pre-screen the content of real-time
+ online voice broadcasts provided by you to platform users. It also does not actively edit, organize, modify, or
+ process live content.
+
+ 2. In accordance with this agreement and the platform rules, you apply to become a broadcaster on the Molistar
+ platform, provide online voice broadcasting services to Molistar platform users, and interact with users. The
+ period during which you provide services on the Molistar platform shall be deemed as the term of the agreement.
+ Molistar conducts formal reviews of the content produced, edited, and produced by you (including but not limited
+ to pictures, posters, avatars, audio, etc.), but you still need to bear the corresponding legal responsibilities
+ for the authenticity, legality, accuracy, timeliness, etc. of the above content.
+
+ 3. During the registration or use of this service, you need to fill in or submit some necessary information and
+ materials for Molistar's review. If the information you submit is incomplete or does not comply with legal
+ regulations or Molistar's regulations, you may not be able to successfully register or may be restricted during
+ the use of this service. If there are changes to your personal information or contact information, you must
+ update Molistar promptly.
+
+ 4. Molistar only provides you with a network platform for online interactive live broadcasting, and your
+ relationship with Molistar does not constitute any employment, labor, or service legal relationship.
+
+ 5. You promise and declare that when providing internet live broadcasting services to platform users, you will
+ strictly comply with relevant laws, regulations, rules, policies, public order, good customs, Molistar's
+ relevant service agreements, platform code of conduct, and management regulations, and shall not engage in any
+ behavior that violates the laws, regulations, rules, policies, or public order and good customs of China and
+ other countries or regions in the name of performing this agreement.
+
+ 6. You promise and declare that when providing internet live broadcasting services to platform users, you will
+ strictly comply with relevant laws, regulations, rules, policies, public order, good customs, relevant service
+ agreements, platform code of conduct, and management regulations, and shall not engage in any behavior that
+ violates the laws, regulations, rules, policies, or public order and good customs of China and other countries
+ or regions in the name of performing this agreement.
+
+ Article 2 Service Rules
+
+ 1. Molistar has the right to formulate operational systems and management rules for broadcasters, and has the
+ right to revise and change agreements, rules, and codes of conduct on the platform (such as Internet websites,
+ mobile networks) regularly or irregularly. It has the right to manage and supervise you, and you understand and
+ agree to this.
+
+ 2. According to your application or the rules announced by the platform, Molistar has the right to entrust the
+ management of broadcasters to your studio, agent company, or other third-party organizations commissioned by
+ your studio or agent company (hereinafter referred to as "guild").
+
+ 3. Molistar has the right to assess and evaluate you according to the platform rules (assessment and evaluation
+ criteria include but are not limited to the length of live broadcasting time, the number of viewers, the
+ quantity and types of virtual gifts given by users, user support, user complaint situations, violations of laws
+ and regulations, etc.) to determine your virtual props and income, impose bans, delete relevant content,
+ temporarily ban/close rooms, specific inspection items and standards are formulated separately, and your consent
+ is not required separately; if you violate laws, regulations, or platform rules and norms during the live
+ broadcast, punishment measures may be taken (including but not limited to deduction of virtual props and income,
+ temporary bans, deletion of relevant content, temporary bans/closure of rooms, or directly suspending your
+ account). If you wish to engage in in-depth cooperation on personal live broadcasting matters, a separate
+ broadcaster cooperation agreement may be signed after friendly negotiation between the two parties.
+
+ 4. Molistar has the right to provide improvement suggestions and opinions on the live broadcasting services you
+ provide on the platform. You should make corresponding adjustments within 3 days after receiving the suggestions
+ or opinions. If you fail to make timely adjustments and violate this agreement or relevant rules, or violate
+ rules or laws, Molistar has the right to take punitive measures (including but not limited to deduction of
+ virtual props and income, bans, deletion of relevant content, temporary bans/closure of rooms, or directly
+ suspending your account).
+
+ 5. Molistar has the right to review the legality of your voice broadcast content (including but not limited to
+ pictures, posters, avatars, audio, etc.) in accordance with legal regulations or requirements of relevant
+ departments. If there is any illegal, irregular, infringing, or infringing on the legitimate rights and
+ interests of third parties in the voice broadcast content, Molistar has the right to take measures such as
+ suspending broadcasting, deleting content, canceling accounts, and cooperating with competent authorities for
+ investigation.
+
+ 6. Molistar has the right to mark watermarks with LOGO (or names) and time in your live broadcast room, and you
+ need to make corresponding adjustments based on the live broadcast effect.
+
+ 7. Molistar is responsible for providing you with a platform for voice broadcasting and providing technical
+ support services for the platform. However, it does not guarantee that the network service will necessarily meet
+ all your requirements, does not guarantee that the network service will always be smooth, and does not guarantee
+ the timeliness, security, and accuracy of the network service.
+
+ 8. Contact you or send relevant notices through platform announcements, platform message push, mobile phone text
+ messages, or regular letters. Such notices shall be deemed as delivered on the date of sending.
+
+ 9. Due to the particularity of voice broadcasting services, you agree that Molistar has the right to change,
+ interrupt, or terminate part or all of the voice broadcasting services at any time. If any loss is caused by
+ changes, interruptions, or terminations of voice broadcasting services, Molistar shall not be liable to you or
+ any third party, but shall endeavor to notify you in advance by means of announcements, emails, or system pop
+
+ -ups before changing, interrupting, or terminating the services, and the date of notification shall be deemed as
+ the completion of delivery.
+
+ Article 3 Rules of Use
+
+ 1. You undertake not to harm the legitimate interests of third parties in performing this agreement (including
+ but not limited to rights of reputation, privacy, portrait rights, etc., intellectual property rights such as
+ copyright) or violate Chinese laws, regulations, normative documents, policies, public order, good customs,
+ socialist morality, etc. You agree and undertake that the performance of this agreement does not violate any
+ legally binding documents on you, nor will it cause any third party to assume any responsibility.
+
+ 2. You fully understand the rules and requirements, guarantee the conditions, capabilities, and qualifications
+ to fulfill the duties and obligations stipulated in this agreement as a broadcaster, carry out Internet live
+ broadcasting activities, and comply with and fulfill the legal obligations stipulated in this agreement.
+
+ 3. You understand and agree that all income generated based on the platform is ultimately based on backend data;
+ at the same time, you must comply with various platform operating systems and requirements updated from time to
+ time, as well as national laws, regulations, normative documents, etc., regarding such Internet
+ services.
+
+ 4. You agree to grant irrevocable free use of your name (including but not limited to your real name, pen name,
+ username, former name, and any symbols representing your identity) and image (including but not limited to real
+ portraits and cartoon portraits, etc.) for various promotional and publicity purposes related to associated
+ companies globally, and provide necessary cooperation.
+
+ 5. You warrant that you own or have legal usage rights to all content uploaded by you, including images,
+ posters, avatars, live content, etc., have legal intellectual property rights and related rights, and have the
+ right to upload and authorize usage. You acknowledge that if you engage in any improper behavior during the use
+ of voice broadcasting services, violate laws, regulations, policies, etc., or infringe on the legitimate rights
+ and interests of third parties, you shall bear corresponding responsibilities, without any liability on the
+ platform. If damage is caused by your actions, you should compensate, and have the right to deduct the
+ compensation directly from your share of the proceeds.
+
+ 6. You shall bear the conditions and expenses (including but not limited to telephone and internet fees for
+ accessing the internet, mobile phone fees for using mobile networks) required for voice broadcasting, and ensure
+ the clear and stable quality of live voice. If live broadcast is interrupted or cannot be viewed due to network
+ issues on your end, you have the right to request an upgrade of the network. You should make corresponding
+ corrections within 3 days after receiving the suggestions or opinions, otherwise, you have the right to take
+ corresponding punitive measures.
+
+ 7. The live broadcasting service and all information, speeches, and content published by you on the platform
+ must not involve politics, guns, drugs, violence, pornography, or other content that violates Chinese laws,
+ regulations, normative documents, policies, public order, good customs, socialist morality, etc., including but
+ not limited to: endangering national security; anti-party, anti-government, or insulting remarks against the
+ party and the state; spreading rumors; illegal activities; obscene content; false, misleading, inducing, or
+ defrauding others; gambling; defamation (including commercial defamation); threats or harassment of others;
+ infringement of others' intellectual property rights, personal rights, trade secrets, or other legal rights;
+ threatening life and health, or using firearms, knives for performance; posting illegal advertisements, junk
+ information; and any content or links that violate social order, public morality, or social ethics.
+
+ 8. You must provide true, accurate, and legally valid personal identity information and contact information to
+ complete real-name authentication; if you are a natural person, you should submit true and valid name, contact
+ phone number (mobile phone), ID card number, etc., and undergo facial recognition and other authentication
+ registrations; if you are a legal person or other organization, you should provide true and valid name, address,
+ contact person, etc., and undergo business license, organizational structure code, and other real-name
+ authentication registrations. If there are changes to personal information or contact information, you must
+ update them promptly.
+
+ 9. You undertake to abide by the principle of honesty and credit, not disturb the normal order of the platform,
+ promise that live broadcast rooms must be used for personal broadcasting or other business purposes added
+ according to the development needs of the platform, and may not be used for any other non-personal broadcasting
+ nature or other activities not allowed by the platform, without consent, not publish commercial advertisements,
+ not engage in activities unrelated to online live performances.
+
+ 10. The account and password registered by you are the only identity credentials for you to accept platform
+ services, which you are solely responsible for keeping and setting passwords, and it is prohibited to gift,
+ borrow, rent, transfer, or sell them. You shall bear all legal responsibilities for all activities and events
+ carried out under your account.
+
+ 11. You undertake that the above information, including but not limited to various accounts used, third-party
+ payment accounts, and corresponding passwords, shall not be disclosed during the process of live broadcasting or
+ using other platform services, nor shall you publish, upload, or provide to others any information involving
+ your privacy through platform services, otherwise, you shall bear the responsibility and loss arising
+ therefrom.
+
+ 12. You undertake to actively maintain the image of the platform, guarantee not to engage in any behavior
+ detrimental to the image and brand, otherwise, the agreement may be terminated, and you may be required to bear
+ all compensation liability.
+
+ 13. During the term of this agreement and after the termination of this agreement, you shall not spread or
+ disseminate through any means or channels (including but not limited to newspapers, media, self-media, websites,
+ blogs, Facebook, LINE chat groups, peer gatherings, etc.) any remarks, images, etc., that damage reputation and
+ image, nor shall you spread any false information through any means, nor shall you imply or publish any speech
+ unfavorable to the platform. In any way, or platform, otherwise, you have the right to claim compensation
+ (including but not limited to deducting virtual props and income, and even directly suspending your
+ account).
+
+ 14. If there are third-party participants in your live broadcast content, you shall ensure that there are no
+ legal disputes with third parties. If there are such disputes, you shall be solely responsible, and the platform
+ shall not be involved. If losses are incurred, you shall compensate for such losses.
+
+ 15. You undertake to actively maintain the image of the platform, and you shall not engage in any behavior that
+ is detrimental to the image or interests of the platform. During the term of this agreement and after the
+ termination of the agreement, you shall not publish or imply in any way through any channel any speech
+ unfavorable to the platform.
+
+ 16. Without written consent, during the use of the platform, you shall not mention or display the names, logos,
+ registration numbers, images, etc., of other live broadcasting platforms in any form (including but not limited
+ to personal dynamics, personal profile pages, live room names, posters, text, voice, pictures, backgrounds,
+ etc.), nor shall you guide existing platform users, other broadcasters, or employees to enter other live
+ broadcasting platforms or provide any services, information, or convenience to them, otherwise, you have the
+ right to take punitive measures against your breach of contract.
+
+ 17. Only platform services are provided, and if you establish contractual relationships with studios, agencies,
+ or other third-party organizations, the disputes arising therefrom shall be unrelated to the platform, and the
+ platform shall not bear any responsibility.
+
+ 18. If you are assigned by a studio, agency, or other third-party organization with whom you have signed
+ relevant agency or service agreements to conduct live interactions, any virtual props and income you receive
+ will be fully paid to the aforementioned organization. Settlement will be handled by the said organization. You
+ agree not to make any claims regarding the aforementioned virtual props or income at any time.
+
+ 19. The platform is committed to spreading positive energy to all users and building a green and healthy
+ internet audio platform. Therefore, you and the platform unanimously agree that if the platform receives
+ complaints or requests for refunds regarding minors purchasing gifts, after verification by relevant national
+ judicial or administrative departments or guardians, both parties are willing to refund the full amount to the
+ guardians of the minors or to the designated units or personnel of the national judicial or administrative
+ departments based on the amounts received. You further acknowledge that you irrevocably authorize the deduction
+ of the refunded amount from your account. If your account balance is insufficient to cover the deduction or if
+ the guardians of the minors or the national judicial or administrative departments have the right to request you
+ to make up for the shortfall.
+
+ Article IV Intellectual Property
+
+ 1. The service, including operated websites, mobile application software, and the contained text, images, audio,
+ trademarks, service marks, company names, and copyrights, among other elements, enjoys full intellectual
+ property rights or has been obtained through legal authorization. The aforementioned intellectual property is
+ protected by relevant laws. With consent, none of the aforementioned materials may be directly or indirectly
+ published, broadcasted, rewritten, or redistributed for broadcasting or publishing purposes in any media, or
+ used for any other commercial purposes by you. The entirety or any portion of the aforementioned intellectual
+ property may only be saved on a computer for personal use. No legal liability is assumed towards you or any
+ third party for any delay, inaccuracy, error, omission arising from or in connection with the creation,
+ transmission, or submission of the aforementioned intellectual property.
+
+ 2. All rights to any software used to provide network services (including but not limited to any images, photos,
+ animations, recordings, music, text, additional programs, and accompanying materials) belong to the copyright
+ holder of that software. Without the permission of the copyright holder of the software, you may not engage in
+ reverse engineering, reverse compilation, reverse assembly, or any other acts to discover the original code of
+ the products related to the platform services, including webpages, applications, software, etc. Otherwise, you
+ shall be liable to the copyright holder of the software for corresponding legal responsibilities.
+
+ 3. The results generated by you during the provision of live streaming services on the platform (including but
+ not limited to live audio, and any text, audio, etc., related to the matters covered by this Agreement,
+ collectively referred to as "Anchor Results"), unless proven otherwise, you are deemed to be the copyright owner
+ of the signed anchor results. Unless otherwise agreed, by providing live streaming through the platform, you are
+ deemed to have the right and agree to grant a free, permanent, irrevocable, exclusive, and transferable right,
+ including but not limited to: the right of reproduction, distribution, rental, exhibition, performance,
+ screening, broadcasting, information network dissemination, production, adaptation, translation, compilation
+ rights, and other copyright-related property rights and neighboring rights.
+
+ 4. The right to use the anchor's portrait, image, name, nickname, and any other relevant image or logo for
+ commercial purposes without the need for your permission or additional payment.
+
+ 5. The right to independently safeguard the intellectual property rights mentioned in the third item above in
+ your own name. You shall actively cooperate and provide any documents required during the assertion of
+ rights.
+
+ 6. We attach great importance to and respect the protection of copyright and other intellectual property rights.
+ You warrant that you have legitimate intellectual property rights and related rights to the internet live
+ streaming content you publish, and there are no circumstances of infringement of third-party legitimate rights
+ and interests. You also guarantee that you or authorized third parties have legal and sufficient rights for the
+ aforementioned authorization, use, etc. You shall ensure that the use of the aforementioned anchor results by
+ you or your authorized third parties will not infringe upon any third-party legitimate rights and interests
+ (including copyrights, performer rights, portrait rights, etc.), and you are not required to pay any fees to any
+ third party. Otherwise, you shall compensate for any losses incurred.
+
+ 7. If it is found or reported by others that the internet live streaming content you have published violates
+ relevant laws and regulations or the provisions of this Agreement or infringes upon rights, we reserve the right
+ to delete the relevant content at any time without notice, and depending on the severity of the actions, impose
+ penalties on you including but not limited to warnings, restrictions or prohibitions on using all or part of the
+ service functions, temporary or permanent freezing or closure of accounts/rooms, and reclaiming or canceling
+ accounts, and announce the processing results.
+
+ 8. If the content published by you violates laws, regulations, agreements, or infringes upon rights, and/or
+ causes responsibility to be borne by the platform, you shall indemnify all losses suffered by the platform,
+ including but not limited to fines, compensation, litigation fees, lawyer fees, notary fees, public relations
+ expenses, travel expenses, and other direct or indirect losses.
+
+ Article V Confidentiality Obligations
+
+ 1. You shall strictly abide by the confidentiality system of the Platform and undertake to keep the commercial
+ secrets of the Platform confidential indefinitely. If you breach the agreement by using or disclosing the
+ commercial secrets of the Platform, and as a result, the Platform suffers any direct or indirect losses in
+ reputation, reputation, or economically, you shall indemnify the Platform with USD 100,000 as liquidated
+ damages. If this amount is not sufficient to compensate for the losses incurred by the Platform, you shall
+ compensate for the remaining losses. Commercial secrets refer to all information related to the business, which
+ can bring economic benefits and have practicality, are not publicly known, and are provided by the Platform or
+ learned by you during the use of the Platform services or for which third parties have confidentiality
+ obligations. This includes but is not limited to: technical information, operational information, administrative
+ management-related information and documents (including the content of this Agreement and related agreements),
+ the amount and settlement method of the service fees you receive, standards, ownership, authorization methods,
+ customer lists, lists of other anchors, contact information, service fees, staff lists, and other non-publicly
+ known information.
+
+ 2. You shall strictly abide by this Agreement and shall not, without written authorization or consent, do the
+ following with the commercial secrets of the Platform:
+
+ 1) Disclose or leak them to third parties or the general public in any way;
+
+ 2) Use the commercial secrets for purposes other than those stated in this Agreement.
+
+ 3. This clause remains valid after the termination of this Agreement.
+
+ Article VI Amendment, Termination, and Conclusion of the Agreement
+
+ 1. The Platform has the right to amend, terminate, or suspend this Agreement as necessary and will notify it on
+ relevant pages. Once the amended agreement is published on the relevant pages, it shall replace the original
+ agreement.
+
+ 2. Both parties may terminate the agreement by mutual agreement.
+
+ 3. If you have any of the following circumstances, the Platform has the right to terminate this Agreement
+ immediately without prior notice:
+
+ 1) If it is discovered that you have violated the statements and commitments made in this Agreement;
+
+ 2) If your personal actions directly or indirectly cause damage to the interests;
+
+ 3) Violation of Chinese or local laws, regulations, or normative provisions, public order, good customs, social
+ morality;
+
+ 4) Violation of other obligations stipulated in this Agreement;
+
+ 5) Failure to correct passive or non-compliant performance of this Agreement within 10 days after
+ notification.
+
+ Article VII Breach of Contract Liability
+
+ 1. You shall be responsible for all direct and indirect expenses, losses, and compensation incurred by any
+ infringement of the legitimate rights and interests of third parties due to your actions, including but not
+ limited to any reasonable expenses incurred for this purpose.
+
+ 2. The Platform has the right to claim compensation from you for any losses caused by your violation of the
+ provisions of this Agreement or the failure of the live streaming services you provided to meet the
+ requirements.
+
+ Article VIII Other
+
+ 1. This Agreement is an integral part of the "Molistar User Registration Service Agreement." The contents not
+ explicitly stated in this Agreement shall be subject to the relevant terms of the "Molistar User Registration
+ Service Agreement." This Agreement may be updated by Molistar at any time. Once the updated terms of the
+ Agreement are published, they shall replace the original terms of the Agreement, and no further notice will be
+ given. You can view the latest version of the Agreement on the Molistar platform. After Molistar modifies the
+ terms of the Agreement, if you do not accept the modified terms, please stop using the services provided by
+ Molistar immediately. Your continued use of the services provided by Molistar will be deemed as acceptance of
+ the modified Agreement.
+
+ 1. In order to maintain a healthy ecosystem on the MolistarApp platform, promote green live streaming, better
+ safeguard the legitimate rights and interests of users, and ensure a good user experience, Wuhan Donglin Information
+ Technology Co., Ltd. has formulated these "MolistarApp Community Guidelines" in accordance with the current relevant
+ laws and regulations such as the "Regulations on Ecological Governance of Internet Information Content",
+ "Administrative Measures for Internet Information Services", "Regulations on the Administration of Internet Live
+ Streaming Services", "Regulations on the Management of Internet Comments", "Regulations on the Administration of
+ Internet Forum Community Services", as well as the "MolistarApp User Registration Service Agreement".
+
+ 2. All activities of MolistarApp users on the MolistarApp platform must comply with the current laws and
+ regulations. Their behaviors and speech must not violate relevant laws and regulations. Otherwise, MolistarApp
+ company will take corresponding measures against violations in accordance with relevant laws and regulations and
+ user agreement rules, and will resolutely prohibit the spread of harmful information and remove illegal
+ content.
+
+ 3. If users have any doubts or disputes about the interpretation and implementation of these guidelines, they can
+ inform us, and we will interpret or handle them according to the relevant rules.
+
+ Community Guidelines
+
+ Encouraged Activities
+
+ MolistarApp platform encourages MolistarApp users to create, replicate, and publish information containing the
+ following content:
+
+ 1. Promote Xi Jinping Thought on Socialism with Chinese Characteristics for a New Era, comprehensively, accurately,
+ and vividly interpret the path, theory, system, and culture of socialism with Chinese characteristics.
+
+ 2. Promote the party's theoretical line, principles, and policies, as well as major decisions and deployments of the
+ central government.
+
+ 3. Showcase highlights of economic and social development, reflecting the great struggles and vibrant lives of the
+ people.
+
+ 4. Promote the core socialist values, disseminate excellent moral culture and the spirit of the times, and fully
+ display the spirited demeanor of the Chinese nation.
+
+ 5. Effectively respond to social concerns, clarify doubts, analyze matters, and help guide the formation of
+ consensus among the masses.
+
+ 6. Contribute to increasing the international influence of Chinese culture and presenting a true, three-dimensional,
+ and comprehensive China to the world.
+
+ 7. Other content that emphasizes taste, style, responsibility, praises truth, goodness, beauty, and promotes unity
+ and stability.
+
+ Prohibited Activities
+
+ MolistarApp users are prohibited from creating, replicating, or publishing prohibited content, including but not
+ limited to the following information. The platform will warn, mute, ban, or device-ban users who violate these
+ rules:
+
+ (1) Content Prohibited by Laws and Regulations
+
+ 1. Opposing the fundamental principles established in the Constitution.
+
+ 2. Endangering national security, leaking state secrets, subverting state power, or undermining national
+ unity.
+
+ 3. Harming the national honor and interests.
+
+ 4. Advocating terrorism, extremism, or inciting terrorist activities or extremist activities.
+
+ 5. Inciting ethnic hatred or discrimination, and undermining ethnic unity.
+
+ 6. Violating the state's religious policies, promoting cults, and feudal superstitions.
+
+ 7. Spreading rumors and disrupting economic and social order.
+
+ 6. Inciting discrimination, regional discrimination, etc.
+
+ 7. Promoting vulgar, vulgar, and tacky content.
+
+ 8. Likely to cause minors to imitate unsafe behaviors, violate social morality, induce minors' bad habits,
+ etc.
+
+ 9. Other content that adversely affects the network ecology.
+
+ (7) Violations of Minors' Legal Rights and Interests
+
+ 1. Posting content that affects minors' establishment of correct values.
+
+ 2. Spreading harmful information to underage users.
+
+ 3. Inducing minors to engage in illegal and bad behaviors.
+
+ 4. Instigating and inducing minors to reward.
+
+ 5. Other actions that infringe on the legitimate rights and interests of minors.
+
+ (8) Complaint Reporting
+
+ 1. The platform strictly prohibits poaching within guilds. If verified through a report, account bans will be
+ implemented. Serious cases will result in punishment for the guild concerned.
+
+ 2. If a user is reported or complained about, once verified, depending on the severity of the case, the reported
+ individual may receive warnings, account bans, etc.
+
+ 3. Users who maliciously report individuals, guilds, etc., without violating community guidelines, once verified,
+ depending on the severity of the case, will receive warnings, mutes, or account bans.
+
+ 4. Users who use inappropriate methods against competitors, guilds, etc., such as organizing instigators to
+ maliciously insult, spread rumors; depending on the severity of the case, warnings, mutes, or account bans will be
+ applied.
+
+ 5. Users who are banned for inappropriate comments, the duration of the ban will increase with each offense.
+
+ 6. Users who repeatedly maliciously report or complain about the platform will be warned, muted, banned, or
+ device-banned.
+
+ 7. All MolistarApp users are requested to abide by the platform's community guidelines. At the same time, everyone
+ is welcome to supervise together and report violations promptly through the platform's complaint channel.
+
+ Broadcasters are obliged to ensure a healthy and orderly community environment for the application. Broadcasters are
+ responsible for all content in audio and video, including guests and live information. If the above parts contain
+ violations, MolistarApp platform officials have the right to punish the violators and broadcasters together.
+
+ These community guidelines are dynamic documents, and we have the right to modify their content according to
+ relevant laws, regulations, policy supervision, or the needs of product/service operation and update them
+ irregularly for public display. The latest updated document shall prevail. The various provisions of these
+ guidelines are based on the basic principles of compliance with national laws, regulations, and policies. In case of
+ inconsistency, the provisions of national laws, regulations, and policies shall prevail.
+
+ These guidelines take effect and are implemented from the date of publication and apply to all users of the
+ MolistarApp platform. User use of MolistarApp platform services is deemed as acceptance of these guidelines, which
+ are legally binding on users.
+
+ These guidelines are an integral part of the "MolistarApp User Registration Service Agreement". In case of any
+ matters not covered by these guidelines, relevant provisions of the "MolistarApp Software License Service Agreement"
+ shall apply.
+
+ Complaints can be sent to molistar666@gmail.com.
`,
+ }
+}
\ No newline at end of file
diff --git a/view/molistar/modules/rule/local/zh.js b/view/molistar/modules/rule/local/zh.js
new file mode 100644
index 00000000..b7f6bff2
--- /dev/null
+++ b/view/molistar/modules/rule/local/zh.js
@@ -0,0 +1,378 @@
+// 中文
+langZh = {
+ // 模块
+ demoModule: {
+ // ==========================================sdk==================================
+ sdk_title: `Molistar第三方SDK目录`,
+ sdk_body: `
`,
+ // ==========================================隐私政策==================================
+ privacyPolicy_title: `隱私政策`,
+ privacyPolicy_body: ``,
+ }
+}
\ No newline at end of file
diff --git a/view/molistar/modules/rule/permissions.html b/view/molistar/modules/rule/permissions.html
index 4029865d..a168dfcf 100644
--- a/view/molistar/modules/rule/permissions.html
+++ b/view/molistar/modules/rule/permissions.html
@@ -6,7 +6,7 @@
- Device Permission List
+ Device Permission List
@@ -47,59 +47,34 @@
-
-
-
Device Permission List
-
- To ensure the functionality and security of Molistar, we may request or use permissions from your device. Below, we display the device permissions that may be requested or used. As Molistar evolves, if there are changes in the types and purposes of permissions requested or used, we will update the list promptly.
-
-
- Please note that third-party SDKs we integrate may also request or use certain device permissions.
-
-
- Permission Name: Read Phone/Call Status
- Permission Function Description: Obtain IMEI and IMSI device identification information as well as the local phone number
- Use Case or Purpose: Used for registration, login, security risk control, preventing account theft, and assisting you in switching between answering calls and live broadcasts in the background
-
-
- Permission Name: Read/Write External Storage
- Permission Function Description: Read and write data in the device storage space
- Use Case or Purpose: Used to ensure the stable operation of the application, allowing users to read, write/download/save/modify images, files, crash logs, and other information when using certain functions
-
-
- Permission Name: Read/Write Clipboard Content
- Permission Function Description: Read and write information in the clipboard for quick copying, input, querying, and entering activities
- Use Case or Purpose: Used for users to quickly copy, input, query, or enter activities, allowing users to quickly read, write, copy, input, query, or enter data, links, text, images, videos, etc., and provide matching results
-
-
- Permission Name: Location
- Permission Function Description: Obtain the geographical location information of the device through GPS or network location information (such as base stations and WLAN)
- Use Case or Purpose: Used for user socialization
-
-
- Permission Name: Microphone
- Permission Function Description: Record audio using the microphone
- Use Case or Purpose: Used to send voice messages and assist you in interactive voice broadcasting
-
-
- Permission Name: Camera
- Permission Function Description: Record video using the camera
- Use Case or Purpose: Used for identity verification, completing photo shooting and publishing, and security verification
-
-
- Permission Name: Read/Write Album
- Permission Function Description: Read and write content in the device's album
- Use Case or Purpose: Used for setting profile pictures and completing photo publishing
-
-
- Permission Name: Software Installation List
- Permission Function Description: Obtain the package name list of installed apps
- Use Case or Purpose: Used to check whether the corresponding app is installed when using third-party app login and sharing functions
-