elhacker.net cabecera Bienvenido(a), Visitante. Por favor Ingresar o Registrarse
¿Perdiste tu email de activación?.

 

 


Tema destacado: Rompecabezas de Bitcoin, Medio millón USD en premios


  Mostrar Mensajes
Páginas: 1 2 3 4 [5] 6 7 8 9 10 11 12 13 14 15 16
41  Programación / .NET (C#, VB.NET, ASP) / Re: Encriptador de mensajes en: 11 Abril 2012, 12:44 pm
puedes hacer un split como dice Elemental Code o tambien tienes la opcion de modificar el code  haciendo un step  2 (haciendo esto para que te alcancen los numeros)

01 =  a
02 =  b
03 = c
04 = d
mira te dejo un ejemplo :
Código
  1. 'Code by Rembolso
  2. ' usando step y optimizando codigo
  3. Const Minus As String = "abcdefghijklmnñopqrstuvwxyz"
  4. Private Function EncriStep(Datos As String)
  5. Dim i, Buff As String
  6.  
  7. For i = 1 To Len(Datos)
  8. If InStr(1, Minus, Mid(Datos, i, 1)) <= 9 Then
  9. Buff = Buff & "0" & InStr(1, Minus, Mid(Datos, i, 1))
  10. Else
  11. Buff = Buff & InStr(1, Minus, Mid(Datos, i, 1))
  12. End If
  13. Next i
  14. EncriStep = Buff
  15. End Function
  16. Private Function DescipStep(Datos As String)
  17. Dim i, Buff As String
  18.  
  19. For i = 1 To Len(Datos) Step 2
  20. If InStr(1, Mid(Datos, i, 2), "0") = 1 Then
  21. Buff = Buff & Mid(Minus, Replace(Mid(Datos, i, 2), 0, ""), 1)
  22. Else
  23. Buff = Buff & Mid(Minus, Mid(Datos, i, 2), 1)
  24. End If
  25. Next i
  26. DescipStep = Buff
  27. End Function
  28. 'ejemplo con msgbox
  29. msgbox  EncriStep("abcdefgho")
  30. MsgBox DescipStep(EncriStep("abcdefgho"))
  31.  
42  Seguridad Informática / Bugs y Exploits / Re: Nuevo Warzone en: 10 Abril 2012, 23:57 pm
coloca tus objetivos. (no todos son los mismo) , y los tips a tener en cuenta. mas info ..  ;D
43  Seguridad Informática / Hacking / Re: Simple tool para inyectar pass en páginas webs en: 10 Abril 2012, 23:31 pm
PASAME EL DICCIONARIO(LISTA DE CONTRASEÑAS)  Y LA PAGINA WEB Y TE DIGO LOS RESULTADOS..
NOTA: TAMBIEN PASAME EL USUARIO.
saludos
44  Seguridad Informática / Hacking / Re: ¿Cómo inyectar pass en páginas webs? en: 9 Abril 2012, 23:12 pm
mira socio . pasate por ak son dos temas abajo tullo .
http://foro.elhacker.net/hacking_avanzado/simple_tool_para_inyectar_pass_en_paginas_webs-t358680.0.html
45  Media / Juegos y Consolas / Re: ¿Que juegos me podrian ser recomendados? en: 9 Abril 2012, 07:52 am
QUAKE LIVE http://www.quakelive.com/
urban terror
46  Programación / Programación Visual Basic / Re: Imagen en un Listview en: 9 Abril 2012, 07:01 am
tienes q poner un imagelist  y establecerlo como default
Listview1.ListItems(columna).ListSubItems(subitem).ReportIcon = icon
47  Seguridad Informática / Hacking / Simple tool para inyectar pass en páginas webs en: 9 Abril 2012, 06:49 am
hola les traigo una herramienta para  inyectar pass en páginas web no tan seguras Ejemplo todas aquellas que utilizan un codigo de verificación de palabras o aquella que no posea ningun código de verificación ni conexiones SSL(seguridad de socket layer)
images de como usar :
inicio : dirigir con el navegador sin proxy a la web., rellenar los cambos de forma correcta menos la contraseña . ahora sigue estos pasos
 paso 1 : configurar el navegador para utilizar el interprete de conexión





ejecutar el BX interpreter (en mi caso me equivoque y puse de user : textpacketxy es testpacketx,)
paso 2 ponemos estar al puerto 80 o el que se nos cante. y con el proxy ya configurado ponemos conectar ,enter o lo que sea determinado para iniciar el usuario


 a continuación recibimos datos  de la conexión , es lo que no sirve , pinchan en la  listview la conexión deseada.
copiamos los datos y abrimos el packetx.exe
donde dice  ip es el host sin el http, el host que nos larga el dato.
 
paso 3 configuramos el dato recibido con los comando.
donde dice conten - leng colocamos: %%lEN%%
respetando los espacios y bites que tenemos . un error al editar el contenido de  forma incorrecta , la conexión es nula.

%%Start%%:  es donde la tool comenzara la lectura de datos
%%End%%: termina la lectura de datos
$$INYECT##: es dato a inyectar del diccionario
%%Set_Range$$: esto es opcional , inyecta un numero random entre (99 *99)
ideal para manejar cokkies o cesiones de datos

 i nos  queda de esta forma

paso 4
colocamos la ruta del diccionario , por motivos de buffer solo posee la capacidad de 999999 palabras (no letras), clic en abrir y luego clic en star.


dentro de 2 segundos se ven los resultados


paso 5 (para facilitar un poco las cosas)
programe una herramienta para ver el contenido de un code gzip
llamado gzip.exe , muy facil de usar, solo hay q indicar la cantidad de conneciones que tenemos en el packetx

NOTA:teneis que habilitar en la parte de configuracion de packetx la casilla de interprete de gzip puerto 80 , si larga error , es porque tenemos el puerto 80 ocupado con otra aplicación

EJEMPLO:
VEMOS QUE Con la cadena choripan no hace efecto miren.


con la cadena rembolso(que es la contraseña del usuario testpacketx miren lo que aparece)

miren la parte de usuarios log : aparece testpacketx

atencion : EL CONJUNTO DE TODOS ESOS SOFT SEGURO TIENEN ERRORES , POR FAVOR IMFORMAR
LES PUSE LAS OCX para que funcione sin problemas , solo registrenlas.
descarga: (ocx,bx-interpreter,gzip,packetx, ejemplos)
http://www.filefactory.com/file/63wnhil8p35f/n/final.rar
48  Programación / Programación Visual Basic / Re: Winsock api UDP en: 2 Abril 2012, 01:03 am
bueno si eso quiere, mira esta buen manejo de api. hace tiempo que lo encontre por internet ,solo tienes que  especificar el protocolo. y si no te gusta el code ,suponiendo que sabes programar en vb  puedes modificarlo para que sea udp fácilmente,
Código:
'This project needs a TextBox
'-> (Name)=Text1
'-> MultiLine=True
'in a form
Private Sub Form_Load()
    'KPD-Team 2000
    'URL: http://www.allapi.net/
    'E-Mail: KPDTeam@Allapi.net
    Dim sSave As String
    Me.AutoRedraw = True
    Set Obj = Me.Text1
    'Start subclassing
    HookForm Me
    'create a new winsock session
    StartWinsock sSave
    'show the winsock version on this form
    If InStr(1, sSave, Chr$(0)) > 0 Then sSave = Left$(sSave, InStr(1, sSave, Chr$(0)) - 1)
    Me.Print sSave
    'connect to Microsoft.com
    lSocket = ConnectSock("www.microsoft.com", 80, 0, Me.hwnd, False)
End Sub
Private Sub Form_Unload(Cancel As Integer)
    'close our connection to microsoft.com
    closesocket lSocket
    'end winsock session
    EndWinsock
    'stop subclassing
    UnHookForm Me
End Sub
'in a module
Public Const AF_INET = 2
Public Const INVALID_SOCKET = -1
Public Const SOCKET_ERROR = -1
Public Const FD_READ = &H1&
Public Const FD_WRITE = &H2&
Public Const FD_CONNECT = &H10&
Public Const FD_CLOSE = &H20&
Public Const PF_INET = 2
Public Const SOCK_STREAM = 1
Public Const IPPROTO_TCP = 6
Public Const GWL_WNDPROC = (-4)
Public Const WINSOCKMSG = 1025
Public Const WSA_DESCRIPTIONLEN = 256
Public Const WSA_DescriptionSize = WSA_DESCRIPTIONLEN + 1
Public Const WSA_SYS_STATUS_LEN = 128
Public Const WSA_SysStatusSize = WSA_SYS_STATUS_LEN + 1
Public Const INADDR_NONE = &HFFFF
Public Const SOL_SOCKET = &HFFFF&
Public Const SO_LINGER = &H80&
Public Const hostent_size = 16
Public Const sockaddr_size = 16
Type WSADataType
    wVersion As Integer
    wHighVersion As Integer
    szDescription As String * WSA_DescriptionSize
    szSystemStatus As String * WSA_SysStatusSize
    iMaxSockets As Integer
    iMaxUdpDg As Integer
    lpVendorInfo As Long
End Type
Type HostEnt
    h_name As Long
    h_aliases As Long
    h_addrtype As Integer
    h_length As Integer
    h_addr_list As Long
End Type
Type sockaddr
    sin_family As Integer
    sin_port As Integer
    sin_addr As Long
    sin_zero As String * 8
End Type
Type LingerType
    l_onoff As Integer
    l_linger As Integer
End Type
Public Declare Function setsockopt Lib "wsock32.dll" (ByVal s As Long, ByVal Level As Long, ByVal optname As Long, optval As Any, ByVal optlen As Long) As Long
Public Declare Function getsockopt Lib "wsock32.dll" (ByVal s As Long, ByVal Level As Long, ByVal optname As Long, optval As Any, optlen As Long) As Long
Public Declare Function WSAGetLastError Lib "wsock32.dll" () As Long
Declare Function SetWindowLong Lib "user32" Alias "SetWindowLongA" (ByVal hwnd As Long, ByVal nIndex As Long, ByVal dwNewLong As Long) As Long
Declare Function CallWindowProc Lib "user32" Alias "CallWindowProcA" (ByVal lpPrevWndFunc As Long, ByVal hwnd As Long, ByVal Msg As Long, ByVal wParam As Long, ByVal lParam As Long) As Long
Public Declare Function WSAIsBlocking Lib "wsock32.dll" () As Long
Public Declare Function WSACleanup Lib "wsock32.dll" () As Long
Public Declare Function Send Lib "wsock32.dll" Alias "send" (ByVal s As Long, buf As Any, ByVal buflen As Long, ByVal flags As Long) As Long
Public Declare Function recv Lib "wsock32.dll" (ByVal s As Long, buf As Any, ByVal buflen As Long, ByVal flags As Long) As Long
Public Declare Function WSAStartup Lib "wsock32.dll" (ByVal wVR As Long, lpWSAD As WSADataType) As Long
Public Declare Function htons Lib "wsock32.dll" (ByVal hostshort As Long) As Integer
Public Declare Function ntohs Lib "wsock32.dll" (ByVal netshort As Long) As Integer
Public Declare Function socket Lib "wsock32.dll" (ByVal af As Long, ByVal s_type As Long, ByVal protocol As Long) As Long
Public Declare Function closesocket Lib "wsock32.dll" (ByVal s As Long) As Long
Public Declare Function Connect Lib "wsock32.dll" Alias "connect" (ByVal s As Long, addr As sockaddr, ByVal namelen As Long) As Long
Public Declare Function WSAAsyncSelect Lib "wsock32.dll" (ByVal s As Long, ByVal hwnd As Long, ByVal wMsg As Long, ByVal lEvent As Long) As Long
Public Declare Function inet_addr Lib "wsock32.dll" (ByVal cp As String) As Long
Public Declare Function gethostbyname Lib "wsock32.dll" (ByVal host_name As String) As Long
Public Declare Sub MemCopy Lib "kernel32" Alias "RtlMoveMemory" (Dest As Any, Src As Any, ByVal cb&)
Public Declare Function inet_ntoa Lib "wsock32.dll" (ByVal inn As Long) As Long
Public Declare Function lstrlen Lib "kernel32" Alias "lstrlenA" (ByVal lpString As Any) As Long
Public Declare Function WSACancelBlockingCall Lib "wsock32.dll" () As Long
Public saZero As sockaddr
Public WSAStartedUp As Boolean, Obj As TextBox
Public PrevProc As Long, lSocket As Long
'subclassing functions
'for more information about subclassing,
'check out the subclassing tutorial at http://www.allapi.net/
Public Sub HookForm(F As Form)
    PrevProc = SetWindowLong(F.hwnd, GWL_WNDPROC, AddressOf WindowProc)
End Sub
Public Sub UnHookForm(F As Form)
    If PrevProc <> 0 Then
        SetWindowLong F.hwnd, GWL_WNDPROC, PrevProc
        PrevProc = 0
    End If
End Sub
Public Function WindowProc(ByVal hwnd As Long, ByVal uMsg As Long, ByVal wParam As Long, ByVal lParam As Long) As Long
    If uMsg = WINSOCKMSG Then
        ProcessMessage wParam, lParam
    Else
        WindowProc = CallWindowProc(PrevProc, hwnd, uMsg, wParam, lParam)
    End If
End Function
'our Winsock-message handler
Public Sub ProcessMessage(ByVal lFromSocket As Long, ByVal lParam As Long)
    Dim X As Long, ReadBuffer(1 To 1024) As Byte, strCommand As String
    Select Case lParam
        Case FD_CONNECT 'we are connected to microsoft.com
        Case FD_WRITE 'we can write to our connection
            'this is a part of the HTTP protocol
            'for more information about this protocol, visit http://www.w3c.org/
            strCommand = "GET http://www.microsoft.com/ HTTP/1.0" + vbCrLf
            strcomand = strCommand + "Pragma: no-cache" + vbCrLf
            strCommand = strCommand + "Accept: */*" + vbCrLf
            strCommand = strCommand + "Accept: text/html" + vbCrLf + vbCrLf
            'send the data to our microsoft.com-connection
            SendData lFromSocket, strCommand
        Case FD_READ 'we have data waiting to be processed
            'start reading the data
            Do
                X = recv(lFromSocket, ReadBuffer(1), 1024, 0)
                If X > 0 Then
                    Obj.Text = Obj.Text + Left$(StrConv(ReadBuffer, vbUnicode), X)
                End If
                If X <> 1024 Then Exit Do
            Loop
        Case FD_CLOSE 'the connection with microsoft.com is closed
    End Select
End Sub
'the following functions are standard WinSock functions
'from the wsksock.bas-file
Public Function StartWinsock(sDescription As String) As Boolean
    Dim StartupData As WSADataType
    If Not WSAStartedUp Then
        If Not WSAStartup(&H101, StartupData) Then
            WSAStartedUp = True
            sDescription = StartupData.szDescription
        Else
            WSAStartedUp = False
        End If
    End If
    StartWinsock = WSAStartedUp
End Function
Sub EndWinsock()
    Dim Ret&
    If WSAIsBlocking() Then
        Ret = WSACancelBlockingCall()
    End If
    Ret = WSACleanup()
    WSAStartedUp = False
End Sub
Public Function SendData(ByVal s&, vMessage As Variant) As Long
    Dim TheMsg() As Byte, sTemp$
    TheMsg = ""
    Select Case VarType(vMessage)
        Case 8209   'byte array
            sTemp = vMessage
            TheMsg = sTemp
        Case 8      'string, if we recieve a string, its assumed we are linemode
            sTemp = StrConv(vMessage, vbFromUnicode)
        Case Else
            sTemp = CStr(vMessage)
            sTemp = StrConv(vMessage, vbFromUnicode)
    End Select
    TheMsg = sTemp
    If UBound(TheMsg) > -1 Then
        SendData = Send(s, TheMsg(0), (UBound(TheMsg) - LBound(TheMsg) + 1), 0)
    End If
End Function
Function ConnectSock(ByVal Host$, ByVal Port&, retIpPort$, ByVal HWndToMsg&, ByVal Async%) As Long
    Dim s&, SelectOps&, Dummy&
    Dim sockin As sockaddr
    SockReadBuffer$ = ""
    sockin = saZero
    sockin.sin_family = AF_INET
    sockin.sin_port = htons(Port)
    If sockin.sin_port = INVALID_SOCKET Then
        ConnectSock = INVALID_SOCKET
        Exit Function
    End If

    sockin.sin_addr = GetHostByNameAlias(Host$)

    If sockin.sin_addr = INADDR_NONE Then
        ConnectSock = INVALID_SOCKET
        Exit Function
    End If
    retIpPort$ = getascip$(sockin.sin_addr) & ":" & ntohs(sockin.sin_port)

    s = socket(PF_INET, SOCK_STREAM, IPPROTO_TCP)
    If s < 0 Then
        ConnectSock = INVALID_SOCKET
        Exit Function
    End If
    If SetSockLinger(s, 1, 0) = SOCKET_ERROR Then
        If s > 0 Then
            Dummy = closesocket(s)
        End If
        ConnectSock = INVALID_SOCKET
        Exit Function
    End If
    If Not Async Then
        If Connect(s, sockin, sockaddr_size) <> 0 Then
            If s > 0 Then
                Dummy = closesocket(s)
            End If
            ConnectSock = INVALID_SOCKET
            Exit Function
        End If
        SelectOps = FD_READ Or FD_WRITE Or FD_CONNECT Or FD_CLOSE
        If WSAAsyncSelect(s, HWndToMsg, ByVal 1025, ByVal SelectOps) Then
            If s > 0 Then
                Dummy = closesocket(s)
            End If
            ConnectSock = INVALID_SOCKET
            Exit Function
        End If
    Else
        SelectOps = FD_READ Or FD_WRITE Or FD_CONNECT Or FD_CLOSE
        If WSAAsyncSelect(s, HWndToMsg, ByVal 1025, ByVal SelectOps) Then
            If s > 0 Then
                Dummy = closesocket(s)
            End If
            ConnectSock = INVALID_SOCKET
            Exit Function
        End If
        If Connect(s, sockin, sockaddr_size) <> -1 Then
            If s > 0 Then
                Dummy = closesocket(s)
            End If
            ConnectSock = INVALID_SOCKET
            Exit Function
        End If
    End If
    ConnectSock = s
End Function
Function GetHostByNameAlias(ByVal hostname$) As Long
    On Error Resume Next
    Dim phe&
    Dim heDestHost As HostEnt
    Dim addrList&
    Dim retIP&
    retIP = inet_addr(hostname)
    If retIP = INADDR_NONE Then
        phe = gethostbyname(hostname)
        If phe <> 0 Then
            MemCopy heDestHost, ByVal phe, hostent_size
            MemCopy addrList, ByVal heDestHost.h_addr_list, 4
            MemCopy retIP, ByVal addrList, heDestHost.h_length
        Else
            retIP = INADDR_NONE
        End If
    End If
    GetHostByNameAlias = retIP
    If Err Then GetHostByNameAlias = INADDR_NONE
End Function
Function getascip(ByVal inn As Long) As String
    On Error Resume Next
    Dim lpStr&
    Dim nStr&
    Dim retString$
    retString = String(32, 0)
    lpStr = inet_ntoa(inn)
    If lpStr = 0 Then
        getascip = "255.255.255.255"
        Exit Function
    End If
    nStr = lstrlen(lpStr)
    If nStr > 32 Then nStr = 32
    MemCopy ByVal retString, ByVal lpStr, nStr
    retString = Left(retString, nStr)
    getascip = retString
    If Err Then getascip = "255.255.255.255"
End Function
Public Function SetSockLinger(ByVal SockNum&, ByVal OnOff%, ByVal LingerTime%) As Long
    Dim Linger As LingerType
    Linger.l_onoff = OnOff
    Linger.l_linger = LingerTime
    If setsockopt(SockNum, SOL_SOCKET, SO_LINGER, Linger, 4) Then
        Debug.Print "Error setting linger info: " & WSAGetLastError()
        SetSockLinger = SOCKET_ERROR
    Else
        If getsockopt(SockNum, SOL_SOCKET, SO_LINGER, Linger, 4) Then
            Debug.Print "Error getting linger info: " & WSAGetLastError()
            SetSockLinger = SOCKET_ERROR
        End If
    End If
End Function
49  Seguridad Informática / Análisis y Diseño de Malware / Re: hallar y modificar firmas de virus de un crypter. en: 1 Abril 2012, 19:53 pm
Mira las firmas de los virus son únicas y poseen un carácter especial como la suma de bit o algún tipo de logaritmo  para identificarse. puesto ya que si modificas esta firma el virus se vera obligado a poner otra , ya que no la reconocerá, explícate bien lo que quieres hacer (Lo que tienes en mente) ,un crypter lo que hace es incluir el codigo del  archivo(ejecutable,dll,*.*) lo cifra, genera otro ejecutable,coloca la firma, y coloca el archivo cifrado.
50  Programación / Programación Visual Basic / Re: Winsock api UDP en: 1 Abril 2012, 07:02 am
Toma de paso infórmate un poco ,

http://es.wikipedia.org/wiki/User_Datagram_Protocol
 :o :o :o
Páginas: 1 2 3 4 [5] 6 7 8 9 10 11 12 13 14 15 16
WAP2 - Aviso Legal - Powered by SMF 1.1.21 | SMF © 2006-2008, Simple Machines